Browse code

novel_splicing GSNAP param should default to FALSE (not 0) in GsnapParams()

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

Michael Lawrence authored on 17/08/2012 20:18:15
Showing 1 changed files

... ...
@@ -152,7 +152,7 @@ GsnapParam <- function(genome, unique_only = FALSE,
152 152
                        npaths = if (unique_only) 1L else 100L,
153 153
                        quiet_if_excessive = unique_only, nofails = unique_only,
154 154
                        split_output = !unique_only,
155
-                       novelsplicing = 0L, splicing = NULL, 
155
+                       novelsplicing = FALSE, splicing = NULL, 
156 156
                        nthreads = 1L, part = NULL, batch = "2", ...) {
157 157
   params <- formals(sys.function())
158 158
   mc <- as.list(match.call(expand.dots = FALSE))[-1L]