git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/SplicingGraphs@75108 bc3139a8-67e5-0310-9ffc-ced21a209358
... | ... |
@@ -1,12 +1,12 @@ |
1 | 1 |
Package: SplicingGraphs |
2 | 2 |
Title: Tools for creating splicing graphs from annotations and RNA-Seq data |
3 |
-Version: 0.8.3 |
|
3 |
+Version: 0.8.4 |
|
4 | 4 |
Author: D. Bindreither, M. Carlson, M. Morgan, H. Pages |
5 | 5 |
License: Artistic-2.0 |
6 |
-Description: This package provides tools for creating splicing graphs based on |
|
7 |
- transcript annotations and additionally tools for testing for |
|
8 |
- differential splicing event usage based on genomic count data from |
|
9 |
- RNA-seq experiments. |
|
6 |
+Description: This package allows the user to create and manipulate splicing |
|
7 |
+ graphs based on annotations that describe a gene model for a given |
|
8 |
+ organism. Additionally the package allows the user to assign RNA-seq |
|
9 |
+ reads to splicing graphs, and to count them. |
|
10 | 10 |
Maintainer: H. Pages <[email protected]> |
11 | 11 |
Depends: BiocGenerics, IRanges (>= 1.17.43), GenomicRanges, |
12 | 12 |
Rgraphviz (>= 2.3.7), GenomicFeatures (>= 1.11.8), Rsamtools |
... | ... |
@@ -36,14 +36,14 @@ EX_OR_IN_LEVELS <- EX_OR_IN_LEVELS2[-4L] |
36 | 36 |
} |
37 | 37 |
|
38 | 38 |
.get_index_of_mcols_to_remove <- function(colnames, |
39 |
- keep.exon.mcols, keep.hits.mcols) |
|
39 |
+ with.exon.mcols, with.hits.mcols) |
|
40 | 40 |
{ |
41 | 41 |
ans <- integer(0) |
42 |
- if (!keep.exon.mcols) { |
|
42 |
+ if (!with.exon.mcols) { |
|
43 | 43 |
idx <- match(EXON_MCOLS, colnames) |
44 | 44 |
ans <- c(ans, idx) |
45 | 45 |
} |
46 |
- if (!keep.hits.mcols) { |
|
46 |
+ if (!with.hits.mcols) { |
|
47 | 47 |
idx <- grep("hits$", colnames) |
48 | 48 |
ans <- c(ans, idx) |
49 | 49 |
} |
... | ... |
@@ -69,17 +69,17 @@ setMethod("intronsByTranscript", "SplicingGraphs", function(x) x@in_by_tx) |
69 | 69 |
### |
70 | 70 |
|
71 | 71 |
setGeneric("sgedgesByTranscript", signature="x", |
72 |
- function(x, keep.exon.mcols=FALSE, keep.hits.mcols=FALSE) |
|
72 |
+ function(x, with.exon.mcols=FALSE, with.hits.mcols=FALSE) |
|
73 | 73 |
standardGeneric("sgedgesByTranscript") |
74 | 74 |
) |
75 | 75 |
|
76 | 76 |
setMethod("sgedgesByTranscript", "SplicingGraphs", |
77 |
- function(x, keep.exon.mcols=FALSE, keep.hits.mcols=FALSE) |
|
77 |
+ function(x, with.exon.mcols=FALSE, with.hits.mcols=FALSE) |
|
78 | 78 |
{ |
79 |
- if (!isTRUEorFALSE(keep.exon.mcols)) |
|
80 |
- stop("'keep.exon.mcols' must be TRUE or FALSE") |
|
81 |
- if (!isTRUEorFALSE(keep.hits.mcols)) |
|
82 |
- stop("'keep.hits.mcols' must be TRUE or FALSE") |
|
79 |
+ if (!isTRUEorFALSE(with.exon.mcols)) |
|
80 |
+ stop("'with.exon.mcols' must be TRUE or FALSE") |
|
81 |
+ if (!isTRUEorFALSE(with.hits.mcols)) |
|
82 |
+ stop("'with.hits.mcols' must be TRUE or FALSE") |
|
83 | 83 |
|
84 | 84 |
ex_by_tx <- unlist(x) |
85 | 85 |
ex_partitioning <- PartitioningByEnd(ex_by_tx) |
... | ... |
@@ -195,7 +195,7 @@ setMethod("sgedgesByTranscript", "SplicingGraphs", |
195 | 195 |
## Drop unwanted columns. |
196 | 196 |
mcol_idx <- .get_index_of_mcols_to_remove( |
197 | 197 |
colnames(ans_unlistData_mcols), |
198 |
- keep.exon.mcols, keep.hits.mcols) |
|
198 |
+ with.exon.mcols, with.hits.mcols) |
|
199 | 199 |
if (length(mcol_idx) != 0L) |
200 | 200 |
ans_unlistData_mcols <- ans_unlistData_mcols[ , -mcol_idx, |
201 | 201 |
drop=FALSE] |
... | ... |
@@ -238,15 +238,15 @@ setMethod("sgedgesByTranscript", "SplicingGraphs", |
238 | 238 |
} |
239 | 239 |
|
240 | 240 |
setGeneric("sgedgesByGene", signature="x", |
241 |
- function(x, keep.exon.mcols=FALSE, keep.hits.mcols=FALSE) |
|
241 |
+ function(x, with.exon.mcols=FALSE, with.hits.mcols=FALSE) |
|
242 | 242 |
standardGeneric("sgedgesByGene") |
243 | 243 |
) |
244 | 244 |
|
245 | 245 |
setMethod("sgedgesByGene", "SplicingGraphs", |
246 |
- function(x, keep.exon.mcols=FALSE, keep.hits.mcols=FALSE) |
|
246 |
+ function(x, with.exon.mcols=FALSE, with.hits.mcols=FALSE) |
|
247 | 247 |
{ |
248 |
- edges_by_tx <- sgedgesByTranscript(x, keep.exon.mcols=keep.exon.mcols, |
|
249 |
- keep.hits.mcols=keep.hits.mcols) |
|
248 |
+ edges_by_tx <- sgedgesByTranscript(x, with.exon.mcols=with.exon.mcols, |
|
249 |
+ with.hits.mcols=with.hits.mcols) |
|
250 | 250 |
edges0 <- unlist(edges_by_tx) |
251 | 251 |
edges0_mcols <- mcols(edges0) |
252 | 252 |
edges0_mcolnames <- colnames(edges0_mcols) |
... | ... |
@@ -36,22 +36,22 @@ |
36 | 36 |
\usage{ |
37 | 37 |
\S4method{intronsByTranscript}{SplicingGraphs}(x) |
38 | 38 |
|
39 |
-sgedgesByTranscript(x, keep.exon.mcols=FALSE, keep.hits.mcols=FALSE) |
|
39 |
+sgedgesByTranscript(x, with.exon.mcols=FALSE, with.hits.mcols=FALSE) |
|
40 | 40 |
|
41 |
-sgedgesByGene(x, keep.exon.mcols=FALSE, keep.hits.mcols=FALSE) |
|
41 |
+sgedgesByGene(x, with.exon.mcols=FALSE, with.hits.mcols=FALSE) |
|
42 | 42 |
} |
43 | 43 |
|
44 | 44 |
\arguments{ |
45 | 45 |
\item{x}{ |
46 | 46 |
A \link{SplicingGraphs} object. |
47 | 47 |
} |
48 |
- \item{keep.exon.mcols}{ |
|
49 |
- Whether to keep the \emph{exon metadata columns} in the returned |
|
50 |
- object or not. Those columns are named: \code{exon_id}, \code{exon_name}, |
|
51 |
- \code{exon_rank}, \code{start_SSid}, and \code{end_SSid}. They are |
|
52 |
- set to \code{NA} for edges of type intron. |
|
48 |
+ \item{with.exon.mcols}{ |
|
49 |
+ Whether to include or not the \emph{exon metadata columns} in the |
|
50 |
+ returned object. Those columns are named: \code{exon_id}, |
|
51 |
+ \code{exon_name}, \code{exon_rank}, \code{start_SSid}, and |
|
52 |
+ \code{end_SSid}. They are set to \code{NA} for edges of type intron. |
|
53 | 53 |
} |
54 |
- \item{keep.hits.mcols}{ |
|
54 |
+ \item{with.hits.mcols}{ |
|
55 | 55 |
TODO |
56 | 56 |
} |
57 | 57 |
} |
... | ... |
@@ -131,7 +131,7 @@ edges_by_tx[names(edges_by_tx) \%in\% "geneB"] |
131 | 131 |
## belongs to transcripts B1 and B2. |
132 | 132 |
|
133 | 133 |
## Keep the "exon metadata columns". |
134 |
-sgedgesByTranscript(sg, keep.exon.mcols=TRUE) |
|
134 |
+sgedgesByTranscript(sg, with.exon.mcols=TRUE) |
|
135 | 135 |
## Note that those cols are set to NA for edges of type intron. |
136 | 136 |
|
137 | 137 |
## --------------------------------------------------------------------- |
... | ... |
@@ -143,5 +143,5 @@ edges_by_gene[["geneB"]] |
143 | 143 |
## Note that the 2 inner elements in 'edges_by_tx' with global edge |
144 | 144 |
## id "geneB:3,4" are now merged into a single inner element. |
145 | 145 |
|
146 |
-sgedgesByGene(sg, keep.exon.mcols=TRUE) |
|
146 |
+sgedgesByGene(sg, with.exon.mcols=TRUE) |
|
147 | 147 |
} |