Browse code

Rsamtools isNotPrimaryRead re-named isSecondaryAlignment

- additional minor code cleanup


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

Martin Morgan authored on 14/12/2014 20:58:28
Showing 6 changed files

... ...
@@ -1,7 +1,7 @@
1 1
 Package: SplicingGraphs
2 2
 Title: Create, manipulate, visualize splicing graphs, and assign RNA-seq reads
3 3
 	to them
4
-Version: 1.7.1
4
+Version: 1.7.2
5 5
 Author: D. Bindreither, M. Carlson, M. Morgan, H. Pages
6 6
 License: Artistic-2.0
7 7
 Description: This package allows the user to create, manipulate, and visualize
... ...
@@ -18,7 +18,7 @@ Imports: methods, utils, igraph,
18 18
 	 BiocGenerics,
19 19
 	 IRanges, GenomicRanges, GenomicFeatures, GenomicAlignments,
20 20
 	 graph, Rgraphviz
21
-Suggests: igraph, Gviz, Rsamtools,
21
+Suggests: igraph, Gviz, Rsamtools (>= 1.19.17),
22 22
 	 TxDb.Hsapiens.UCSC.hg19.knownGene, RNAseqData.HNRNPC.bam.chr14,
23 23
 	 RUnit
24 24
 Collate: utils.R
... ...
@@ -121,7 +121,7 @@ get_TSPC_bam_status <- function(subdir_path, sample_name)
121 121
         return(".")
122 122
     library(Rsamtools)
123 123
     flag0 <- scanBamFlag(#isProperPair=TRUE,
124
-                         isNotPrimaryRead=FALSE,
124
+                         isSecondaryAlignment=FALSE,
125 125
                          isNotPassingQualityControls=FALSE,
126 126
                          isDuplicate=FALSE)
127 127
     param0 <- ScanBamParam(flag=flag0, what="flag")
... ...
@@ -161,7 +161,7 @@ get_TSPC_bam_gaprate <- function(subdir_path, sample_name)
161 161
         return(NA_real_)
162 162
     library(Rsamtools)
163 163
     flag0 <- scanBamFlag(#isProperPair=TRUE,
164
-                         isNotPrimaryRead=FALSE,
164
+                         isSecondaryAlignment=FALSE,
165 165
                          isNotPassingQualityControls=FALSE,
166 166
                          isDuplicate=FALSE)
167 167
     param0 <- ScanBamParam(flag=flag0, what="cigar")
... ...
@@ -203,7 +203,7 @@ load_TSPC_bam <- function(subdir_path, sample_name, gapped.reads.only=FALSE)
203 203
              "and paired-end reads")
204 204
     library(Rsamtools)
205 205
     flag0 <- scanBamFlag(#isProperPair=TRUE,
206
-                         isNotPrimaryRead=FALSE,
206
+                         isSecondaryAlignment=FALSE,
207 207
                          isNotPassingQualityControls=FALSE,
208 208
                          isDuplicate=FALSE)
209 209
     param0 <- ScanBamParam(flag=flag0, what="mapq")
... ...
@@ -14,7 +14,7 @@
14 14
 .load_toy_reads <- function()
15 15
 {
16 16
     library(Rsamtools)
17
-    flag0 <- scanBamFlag(isNotPrimaryRead=FALSE,
17
+    flag0 <- scanBamFlag(isSecondaryAlignment=FALSE,
18 18
                          isNotPassingQualityControls=FALSE,
19 19
                          isDuplicate=FALSE)
20 20
     param0 <- ScanBamParam(flag=flag0)
... ...
@@ -71,12 +71,12 @@ removeReads(sg)
71 71
   will pair them.
72 72
 
73 73
   If (b): you can filter out secondary alignments by passing
74
-  \code{'isNotPrimaryRead=FALSE'} to \code{\link[Rsamtools]{scanBamFlag}}
74
+  \code{'isSecondaryAlignment=FALSE'} to \code{\link[Rsamtools]{scanBamFlag}}
75 75
   when preparing the \link[Rsamtools]{ScanBamParam} object used to load
76 76
   the reads. For example:
77 77
   \preformatted{
78 78
     library(Rsamtools)
79
-    flag0 <- scanBamFlag(isNotPrimaryRead=FALSE,
79
+    flag0 <- scanBamFlag(isSecondaryAlignment=FALSE,
80 80
                          isNotPassingQualityControls=FALSE,
81 81
                          isDuplicate=FALSE)
82 82
     param0 <- ScanBamParam(flag=flag0)
... ...
@@ -144,7 +144,7 @@ names(sg)
144 144
 ## duplicates (see ?scanBamFlag in the Rsamtools package for more
145 145
 ## information):
146 146
 library(Rsamtools)
147
-flag0 <- scanBamFlag(isNotPrimaryRead=FALSE,
147
+flag0 <- scanBamFlag(isSecondaryAlignment=FALSE,
148 148
                      isNotPassingQualityControls=FALSE,
149 149
                      isDuplicate=FALSE)
150 150
 param0 <- ScanBamParam(flag=flag0)
... ...
@@ -146,7 +146,7 @@ plot(sgraph(sg["geneD"], tx_id.as.edge.label=TRUE, as.igraph=TRUE))
146 146
 ## optical duplicates (see ?scanBamFlag in the Rsamtools package for
147 147
 ## more information):
148 148
 library(Rsamtools)
149
-flag0 <- scanBamFlag(isNotPrimaryRead=FALSE,
149
+flag0 <- scanBamFlag(isSecondaryAlignment=FALSE,
150 150
                      isNotPassingQualityControls=FALSE,
151 151
                      isDuplicate=FALSE)
152 152
 param0 <- ScanBamParam(flag=flag0)
... ...
@@ -866,7 +866,7 @@ that we'll pass to \Rfunction{readGAlignmentPairs} (see
866 866
 about this):
867 867
 
868 868
 <<ScanBamParam>>=
869
-flag0 <- scanBamFlag(isNotPrimaryRead=FALSE,
869
+flag0 <- scanBamFlag(isSecondaryAlignment=FALSE,
870 870
                      isNotPassingQualityControls=FALSE,
871 871
                      isDuplicate=FALSE)
872 872
 param0 <- ScanBamParam(flag=flag0)