... | ... |
@@ -2,7 +2,7 @@ Package: TCC |
2 | 2 |
Type: Package |
3 | 3 |
Title: TCC: Differential expression analysis for tag count data with |
4 | 4 |
robust normalization strategies |
5 |
-Version: 1.20.0 |
|
5 |
+Version: 1.20.1 |
|
6 | 6 |
Author: Jianqiang Sun, Tomoaki Nishiyama, Kentaro Shimizu, and Koji Kadota |
7 | 7 |
Maintainer: Jianqiang Sun <wukong@bi.a.u-tokyo.ac.jp>, Tomoaki |
8 | 8 |
Nishiyama <tomoakin@staff.kanazawa-u.ac.jp> |
... | ... |
@@ -21,7 +21,6 @@ Description: This package provides a series of functions for performing |
21 | 21 |
virtue of the use of combinations of functions in depended |
22 | 22 |
packages. |
23 | 23 |
Depends: R (>= 2.15), methods, DESeq, DESeq2, edgeR, baySeq, ROC |
24 |
-Imports: samr |
|
25 | 24 |
Suggests: RUnit, BiocGenerics |
26 | 25 |
Enhances: snow |
27 | 26 |
License: GPL-2 |
... | ... |
@@ -74,13 +74,13 @@ TCC <- setRefClass( |
74 | 74 |
private$paired <<- FALSE |
75 | 75 |
private$available$norm.method <<- c("tmm", "deseq", "deseq2") |
76 | 76 |
private$available$test.method <<- data.frame( |
77 |
- TGY = c(T, T, T, T, T, T), # ID:1 (two-group) |
|
78 |
- TGN = c(T, T, T, T, F, F), # ID:1 (two-group without replicate) |
|
79 |
- TGNP = c(T, T, T, T, T, T), # ID:4 (paired two-group) |
|
80 |
- MGY = c(T, T, T, T, T, T), # ID:2 (three-group) |
|
81 |
- MGN = c(T, T, T, T, F, F), # ID:2 (three-group without replicate) |
|
82 |
- MF = c(T, T, T, T, F, T), # ID:3 (multi-factors) |
|
83 |
- row.names = c("bayseq", "deseq", "deseq2", "edger", "samseq", "voom") |
|
77 |
+ TGY = c(T, T, T, T, T), # ID:1 (two-group) |
|
78 |
+ TGN = c(T, T, T, T, F), # ID:1 (two-group without replicate) |
|
79 |
+ TGNP = c(T, T, T, T, T), # ID:4 (paired two-group) |
|
80 |
+ MGY = c(T, T, T, T, T), # ID:2 (three-group) |
|
81 |
+ MGN = c(T, T, T, T, F), # ID:2 (three-group without replicate) |
|
82 |
+ MF = c(T, T, T, T, T), # ID:3 (multi-factors) |
|
83 |
+ row.names = c("bayseq", "deseq", "deseq2", "edger", "voom") |
|
84 | 84 |
) |
85 | 85 |
} |
86 | 86 |
) |
... | ... |
@@ -168,7 +168,6 @@ TCC$methods(calcNormFactors = function(norm.method = NULL, |
168 | 168 |
"deseq2" = .self$.testByDeseq2(...), |
169 | 169 |
"bayseq" = .self$.testByBayseq(...), |
170 | 170 |
"voom" = .self$.testByLimmavoom(...), |
171 |
- "samseq" = .self$.testBySamseq(...), |
|
172 | 171 |
"wad" = .self$.testByWad(...), |
173 | 172 |
#"yayoi" = .self$.testByYayoi(norm = TRUE, ...), |
174 | 173 |
stop(paste("\nTCC::ERROR: The identifying method of ", test.method, " doesn't supported.\n")) |
... | ... |
@@ -136,9 +136,6 @@ TCC$methods(estimateDE = function (test.method = NULL, |
136 | 136 |
bgroup = bayseq.group, |
137 | 137 |
paired = paired, |
138 | 138 |
...), |
139 |
- "samseq" = .self$.testBySamseq(samplesize = samplesize, |
|
140 |
- paired = paired, |
|
141 |
- ...), |
|
142 | 139 |
"voom" = .self$.testByLimmavoom(design = design, |
143 | 140 |
coef = coef, |
144 | 141 |
paired = paired, |
... | ... |
@@ -32,7 +32,7 @@ The estimated normalization factors obtained by using the |
32 | 32 |
\code{\link{calcNormFactors}} function are used within the statistical |
33 | 33 |
model for differential analysis in the \code{\link{estimateDE}} function. |
34 | 34 |
Both two functions internally call functions from other packages |
35 |
-(edgeR, DESeq, baySeq, EBSeq, and samr) when specified. |
|
35 |
+(edgeR, DESeq, baySeq, and EBSeq) when specified. |
|
36 | 36 |
TCC also provides some useful functions: \code{\link{simulateReadCounts}} |
37 | 37 |
for generating simulation data with various experimental designs, |
38 | 38 |
\code{\link{plot}} for depicting a M-A plot, |
... | ... |
@@ -30,7 +30,7 @@ The procedure can generally be described as the |
30 | 30 |
\item{test.method}{character specifying a method for identifying |
31 | 31 |
differentially expressed genes (DEGs) used in \eqn{STEP2}: |
32 | 32 |
one of \code{"edger"}, \code{"deseq"}, \code{"deseq2"}, |
33 |
- \code{"bayseq"}, \code{"samseq"}, \code{"voom"} and \code{"wad"}. |
|
33 |
+ \code{"bayseq"}, \code{"voom"} and \code{"wad"}. |
|
34 | 34 |
See the "Details" filed in \code{\link{estimateDE}} for detail. |
35 | 35 |
The default is \code{"edger"} when analyzing the count data with |
36 | 36 |
multiple replicates (i.e., \code{min(table(tcc$group[, 1])) > 1}), |
... | ... |
@@ -24,7 +24,7 @@ implemented in other R packages. |
24 | 24 |
|
25 | 25 |
\item{test.method}{character string specifying a method for identifying |
26 | 26 |
DEGs: one of \code{"edger"}, \code{"deseq"}, \code{"deseq2"}, |
27 |
- \code{"bayseq"}, \code{"samseq"}, \code{"voom"}, and \code{"wad"}. |
|
27 |
+ \code{"bayseq"}, \code{"voom"}, and \code{"wad"}. |
|
28 | 28 |
See the "Details" field for detail. |
29 | 29 |
The default is \code{"edger"} when analyzing the count data with |
30 | 30 |
replicates (i.e., \code{min(table(tcc$group[, 1])) > 1}), and |
... | ... |
@@ -82,9 +82,7 @@ implemented in other R packages. |
82 | 82 |
for details.} |
83 | 83 |
|
84 | 84 |
\item{samplesize}{integer specifying (i) the sample size for estimating the |
85 |
- prior parameters if \code{test.method = "bayseq"} (defaults to 10000), |
|
86 |
- and (ii) the number of permutation in samr if |
|
87 |
- \code{test.method = "samseq"} (defaults to 100).} |
|
85 |
+ prior parameters if \code{test.method = "bayseq"} (defaults to 10000).} |
|
88 | 86 |
|
89 | 87 |
\item{logged}{logical. If \code{TRUE}, the input data are regarded as |
90 | 88 |
log2-transformed. If \code{FALSE}, the log2-transformation is |
... | ... |
@@ -157,12 +155,6 @@ packages are internally called according to the specified |
157 | 155 |
If \code{paired = TRUE}, |
158 | 156 |
\code{\link[baySeq]{getPriors}} and |
159 | 157 |
\code{\link[baySeq]{getLikelihoods}} in baySeq are used. |
160 |
- \item \code{test.method = "samseq"}\cr |
|
161 |
- \code{\link[samr]{SAMseq}} with |
|
162 |
- \code{resp.type = "Two class unpaired"} arugment |
|
163 |
- in samr package is called to identify DEGs for two-group data, |
|
164 |
- \code{resp.type = "Two class paired"} for paired two-group data, |
|
165 |
- and \code{resp.type = "Multiclass"} for multi-group data. |
|
166 | 158 |
\item \code{test.method = "voom"}\cr |
167 | 159 |
\code{\link[limma]{voom}}, \code{\link[limma]{lmFit}}, and |
168 | 160 |
\code{\link[limma]{eBayes}} in limma are internally called |