Entering edit mode
Hi All,
I have an experiment that is exactly the same as the one described in
section 3.5 (Comparisons Both Between and Within Subjects) in the
manual<http: www.bioconductor.org="" packages="" release="" bioc="" vignettes="" edg="" er="" inst="" doc="" edgerusersguide.pdf="">
:
The experiment has 18 RNA samples collected from 9 subjects. The
samples
correspond to cells from 3 healthy patients, either treated or not
with a
hormone; cells from 3 patients with disease 1, either treated or not
with
the hormone; and cells from 3 patients with disease 2, either treated
or
not with the hormone.
I now find genes responding to the hormone in disease1 patients using
two
approachs glm and edgeR classic. The results are dramatically
different !!!
glm gives hundreds of differentially expressed genes, while edgeR
classic
gives 0.
Could anyone tell me that is what one can expect or I'm totally wrong
!
data.frame(Disease,Patient,Treatment)
design <- model.matrix(~Disease+Disease:Patient+Disease:Treatment)
colnames(design)
y <- estimateGLMCommonDisp(y,design)
y <- estimateGLMTrendedDisp(y,design)
y <- estimateGLMTagwiseDisp(y,design)
fit <- glmFit(y, design)
lrt <- glmLRT(fit, coef="DiseaseDisease1:TreatmentHormone")
topTags(lrt)
detags <- rownames(topTags(lrt)$table)
cpm(y)[detags, order(y$samples$group)]
summary(de <- decideTestsDGE(lrt))
This gives 612 (-1) and 1129 (+1) genes.
I now try to just use 3 patients with Disease1, treated and non
treated
with hormone as 2 groups and apply the classic edgeR to find the
effect of
hormon to disease1:
targets <-readTargets()
x <-read.delim("new.counts", row.names="id")
x_c_n <- x[c("d1_1_hormone", "d1_2_hormone", "d1_3_hormone", "d_1",
"d_2",
"d_3")]
g <- factor(c(1,1,1,2,2,2))
y <- DGEList(counts=x_c_n, group=g)
y <- calcNormFactors(y)
y <- estimateCommonDisp(y)
y <- estimateTagwiseDisp(y)
et <- exactTest(y)
topTags(et)
summary(de <- decideTestsDGE(et))
This gives 0 (-1) and also 0 (+1) gene !!!!
How can there be such a significant difference between these two
approaches? Or I'm wrong?
Thank you,
Son.
[[alternative HTML version deleted]]