Browse code

fix change of cds_iit to exon_iit

git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/gmapR@93358 bc3139a8-67e5-0310-9ffc-ced21a209358

Gabriel Becker authored on 13/08/2014 20:26:10
Showing 1 changed files

... ...
@@ -186,9 +186,9 @@ normArgTRUEorFALSE <- function(x) {
186 186
   x
187 187
 }
188 188
 
189
-normArgSingleCharacter <- function(x) {
189
+normArgSingleCharacterOrNULL <- function(x) {
190 190
   name <- deparse(substitute(x))
191
-  if (!is(x, "character") || length(x) != 1)
191
+  if (!is.null(x) && (!is(x, "character") || length(x) != 1))
192 192
     stop("'", name, "' should be a single character value")
193 193
   x
194 194
 }
... ...
@@ -206,7 +206,7 @@ normArgSingleCharacter <- function(x) {
206 206
                          indels = FALSE,
207 207
                          blocksize = 1000L, verbosep = FALSE,
208 208
                          include_soft_clips = 0L,
209
-                         cds_iit)
209
+                         exon_iit = NULL)
210 210
 {
211 211
   if (!is(bamreader, "GmapBamReader"))
212 212
     stop("'bamreader' must be a GmapBamReader")
... ...
@@ -245,7 +245,7 @@ normArgSingleCharacter <- function(x) {
245 245
         normArgSingleInteger(blocksize),
246 246
         normArgTRUEorFALSE(verbosep),
247 247
         normArgSingleInteger(include_soft_clips),
248
-        normArgSingleCharacter(cds_iit))
248
+        normArgSingleCharacterOrNULL(exon_iit))
249 249
 }
250 250
 
251 251
 ### - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -