... | ... |
@@ -1,5 +1,5 @@ |
1 | 1 |
Package: DEsubs |
2 |
-Version: 1.17.0 |
|
2 |
+Version: 1.17.1 |
|
3 | 3 |
Date: 2017-07-23 |
4 | 4 |
Title: DEsubs: an R package for flexible identification of |
5 | 5 |
differentially expressed subpathways using RNA-seq expression |
... | ... |
@@ -26,7 +26,7 @@ Date/Publication: |
26 | 26 |
NeedsCompilation: no |
27 | 27 |
LazyLoad: yes |
28 | 28 |
Imports: graph, igraph, RBGL, circlize, limma, edgeR, EBSeq, |
29 |
- NBPSeq, DESeq, stats, grDevices, graphics, pheatmap, utils, |
|
29 |
+ NBPSeq, stats, grDevices, graphics, pheatmap, utils, |
|
30 | 30 |
ggplot2, Matrix, jsonlite, tools, DESeq2, methods |
31 | 31 |
Suggests: RUnit, BiocGenerics, knitr |
32 | 32 |
VignetteBuilder: knitr |
... | ... |
@@ -1,18 +1,11 @@ |
1 | 1 |
import( 'locfit' ) |
2 |
-importFrom( 'DESeq', |
|
3 |
- 'newCountDataSet', |
|
4 |
- 'estimateSizeFactors', |
|
5 |
- 'estimateDispersions', |
|
6 |
- 'nbinomTest', |
|
7 |
- 'getVarianceStabilizedData') |
|
2 |
+ |
|
8 | 3 |
importFrom( 'DESeq2', |
9 | 4 |
'DESeqDataSetFromMatrix', |
10 | 5 |
'estimateSizeFactors', |
11 | 6 |
'estimateDispersions', |
12 | 7 |
'nbinomWaldTest', |
13 | 8 |
'results') |
14 |
- |
|
15 |
- |
|
16 | 9 |
importFrom( 'limma', |
17 | 10 |
'voom', |
18 | 11 |
'lmFit', |
... | ... |
@@ -136,7 +129,8 @@ importFrom( 'methods', |
136 | 129 |
'setGeneric', |
137 | 130 |
'setMethod', |
138 | 131 |
'signature', |
139 |
- 'new') |
|
132 |
+ 'new', |
|
133 |
+ 'is') |
|
140 | 134 |
export( 'DEsubs', |
141 | 135 |
'geneVisualization', |
142 | 136 |
'organismVisualization', |
... | ... |
@@ -60,8 +60,8 @@ DEsubs <- function( org, mRNAexpr, mRNAnomenclature, pathways, |
60 | 60 |
if ( missing(classes) ) { message('Please supply the classes.') } |
61 | 61 |
if ( missing(DEGchoice) ) { message('Please supply a type.') } |
62 | 62 |
|
63 |
- supportedMethods <- c('edgeR', 'DESeq', 'EBSeq', 'NBPSeq', |
|
64 |
- 'voom+limma', 'vst+limma', 'TSPM') |
|
63 |
+ supportedMethods <- c( |
|
64 |
+ 'edgeR', 'DESeq2', 'EBSeq', 'NBPSeq', 'voom+limma', 'vst2+limma', 'TSPM') |
|
65 | 65 |
|
66 | 66 |
if ( DEGchoice == 'edgeR' ) |
67 | 67 |
{ |
... | ... |
@@ -79,24 +79,6 @@ DEsubs <- function( org, mRNAexpr, mRNAnomenclature, pathways, |
79 | 79 |
|
80 | 80 |
return(adjpvalues) |
81 | 81 |
} |
82 |
- if ( DEGchoice == 'DESeq' ) |
|
83 |
- { |
|
84 |
- # run DESeq |
|
85 |
- DESeq.cds <- DESeq::newCountDataSet(countData=count.matrix, |
|
86 |
- conditions=factor(classes)) |
|
87 |
- DESeq.cds <- DESeq::estimateSizeFactors(DESeq.cds) |
|
88 |
- DESeq.cds <- DESeq::estimateDispersions(DESeq.cds, |
|
89 |
- sharingMode="maximum", method="pooled", |
|
90 |
- fitType="local") |
|
91 |
- DESeq.test <- nbinomTest(DESeq.cds, "1", "2") |
|
92 |
- DESeq.pvalues <- DESeq.test[['pval']] |
|
93 |
- genes <- DESeq.test[['id']] |
|
94 |
- DESeq.adjpvalues <- p.adjust(DESeq.pvalues, method="BH") |
|
95 |
- adjpvalues <- DESeq.adjpvalues |
|
96 |
- names(adjpvalues) <- genes |
|
97 |
- |
|
98 |
- return(adjpvalues) |
|
99 |
- } |
|
100 | 82 |
if ( DEGchoice == 'voom+limma' ) |
101 | 83 |
{ |
102 | 84 |
# voom+limma |
... | ... |
@@ -116,34 +98,6 @@ DEsubs <- function( org, mRNAexpr, mRNAnomenclature, pathways, |
116 | 98 |
|
117 | 99 |
return(adjpvalues) |
118 | 100 |
} |
119 |
- # if ( DEGchoice == 'samr' ) |
|
120 |
- # { |
|
121 |
- # # samr |
|
122 |
- # sink( tempfile() ) |
|
123 |
- # SAMseq.test <- suppressMessages(SAMseq(count.matrix, classes, |
|
124 |
- # resp.type="Two class unpaired", |
|
125 |
- # geneid = rownames(count.matrix), |
|
126 |
- # genenames = rownames(count.matrix), |
|
127 |
- # nperms = 100, nresamp = 20, fdr.output = 1)) |
|
128 |
- # SAMseq.result.table <- rbind( |
|
129 |
- # SAMseq.test[['siggenes.table']][['genes.up']], |
|
130 |
- # SAMseq.test[['siggenes.table']][['genes.lo']]) |
|
131 |
- # SAMseq.score <- rep(0, nrow(count.matrix)) |
|
132 |
- # idx <- match(SAMseq.result.table[,1], |
|
133 |
- # rownames(count.matrix)) |
|
134 |
- # SAMseq.score[idx] <- as.numeric(SAMseq.result.table[,3]) |
|
135 |
- # SAMseq.FDR <- rep(1, nrow(count.matrix)) |
|
136 |
- # idx <- match(SAMseq.result.table[,1], |
|
137 |
- # rownames(count.matrix)) |
|
138 |
- # SAMseq.FDR[idx] <- as.numeric(SAMseq.result.table[,5])/100 |
|
139 |
- # adjpvalues <- SAMseq.FDR |
|
140 |
- # genes <- SAMseq.result.table[, 'Gene ID'] |
|
141 |
- # names(adjpvalues) <- genes |
|
142 |
- |
|
143 |
- # sink() |
|
144 |
- |
|
145 |
- # return(adjpvalues) |
|
146 |
- # } |
|
147 | 101 |
if ( DEGchoice == 'EBSeq' ) |
148 | 102 |
{ |
149 | 103 |
# run EBSeq |
... | ... |
@@ -166,26 +120,6 @@ DEsubs <- function( org, mRNAexpr, mRNAnomenclature, pathways, |
166 | 120 |
|
167 | 121 |
return(adjpvalues) |
168 | 122 |
} |
169 |
- if ( DEGchoice == 'vst+limma' ) |
|
170 |
- { |
|
171 |
- # vst+limma |
|
172 |
- DESeq.cds <- newCountDataSet( countData=count.matrix, |
|
173 |
- conditions=factor(classes)) |
|
174 |
- DESeq.cds <- estimateSizeFactors(DESeq.cds) |
|
175 |
- DESeq.cds <- estimateDispersions( DESeq.cds, |
|
176 |
- method="blind", fitType="local") |
|
177 |
- DESeq.vst <- getVarianceStabilizedData(DESeq.cds) |
|
178 |
- DESeq.vst.fitlimma <- lmFit( DESeq.vst, |
|
179 |
- design=model.matrix(~factor(classes))) |
|
180 |
- DESeq.vst.fitbayes <- eBayes(DESeq.vst.fitlimma) |
|
181 |
- DESeq.vst.pvalues <- DESeq.vst.fitbayes[['p.value']][, 2] |
|
182 |
- genes <- rownames(DESeq.vst.fitbayes[['p.value']]) |
|
183 |
- DESeq.vst.adjpvalues <- p.adjust(DESeq.vst.pvalues, method="BH") |
|
184 |
- adjpvalues <- DESeq.vst.adjpvalues |
|
185 |
- names(adjpvalues) <- genes |
|
186 |
- |
|
187 |
- return(adjpvalues) |
|
188 |
- } |
|
189 | 123 |
if ( DEGchoice == 'NBPSeq' ) |
190 | 124 |
{ |
191 | 125 |
# NBPSeq |
... | ... |
@@ -262,6 +196,7 @@ DEsubs <- function( org, mRNAexpr, mRNAnomenclature, pathways, |
262 | 196 |
|
263 | 197 |
return(adjpvalues) |
264 | 198 |
} |
199 |
+ |
|
265 | 200 |
if ( !is.null(DEGchoice) ) |
266 | 201 |
{ |
267 | 202 |
unsupportedOptions <- DEGchoice[!DEGchoice %in% supportedMethods] |
... | ... |
@@ -16,8 +16,8 @@ or a filename of a text file stored in the 'User' directory.} |
16 | 16 |
'ensembl_transcript_id', 'ensembl_peptide_id', 'hgnc_id', 'hgnc_symbol', |
17 | 17 |
'hgnc_transcript_name', 'refseq_mrna', 'refseq_peptide')} |
18 | 18 |
\item{pathways}{Pathway type ('All', 'Non-Metabolic', 'Metabolic')} |
19 |
-\item{DEtool}{DEG analysis tool selection for NodeRule ('edgeR', 'DESeq', |
|
20 |
- 'EBSeq', 'NBPSeq', 'voom+limma', 'vst+limma', 'TSPM')} |
|
19 |
+\item{DEtool}{DEG analysis tool selection for NodeRule ('edgeR', 'DESeq2', |
|
20 |
+ 'EBSeq', 'NBPSeq', 'voom+limma', 'vst2+limma', 'TSPM')} |
|
21 | 21 |
\item{DEpar}{DE analysis tools Q-value threshold of NodeRule |
22 | 22 |
(default: DEGpar = 0.05)} |
23 | 23 |
\item{CORtool}{ Correlation measure selection for EdgeRule |
... | ... |
@@ -199,9 +199,9 @@ Table: Edge Rule options |
199 | 199 |
Supported Labels R command |
200 | 200 |
-------------- ---------------- |
201 | 201 |
[@robinson2010edger] 'edgeR' |
202 |
-[@anders2010differential] 'DESeq' |
|
202 |
+[@anders2010differential] 'DESeq2' |
|
203 | 203 |
[@leng2013ebseq] 'EBSeq' |
204 |
-[@smyth2004linear] 'vst+limma' |
|
204 |
+[@smyth2004linear] 'vst2+limma' |
|
205 | 205 |
[@anders2010differential]; [@smyth2004linear] 'voom+limma' |
206 | 206 |
[@di2011nbp] 'NBPSeq' |
207 | 207 |
[@auer2011two] 'TSPM' |