Entering edit mode
Eduardo Andrés León
▴
90
@eduardo-andres-leon-5963
Last seen 10.3 years ago
Hi all,
I'm trying to analyse data coming from a Small RNAseq with a
"complex" design.
I have 2 different kind of mice,a wild type and a mutant. The mutant
has an insert to over express a gene of interest. and It's a different
mouse from the wild type because the wild type with the insert did't
born.
Second, in order to over express a gene, we add a drug, so we have 4
possibilities :
WTsD (wild type no treated)
WTcD (wild type treated) . Just to see if adding the drug is also
affecting the mouse expression profile
MTsD (mouse with the insertion) . In this case, to see if the
insertion is also affecting the normal expression profile of miRNAs.
MTcD (mouse with the insertion + drug) . How the over expression
affects.
Of course this is also a time course design because the drug is added
at 7 days, 9 days and 11 days,
So first of all, I'd like to see DE miRNAs taking into account just
the overexpression of the gene (that is by removing the changes
caused for the drug and for the mouse type ).
I've tried with DESeq with the following code :
library(DESeq)
#Reading count data
data<-read.table(file="ALL_MTcD_9.5",header=TRUE,row.names=1)
#Design
Design<-data.frame(
row.names=colnames(data),
treatment =c("untreated","untreated","untreated","treated","treated"
,"treated","untreated","untreated","untreated","treated","treated","tr
eated"),
mouseType
=c("WT","WT","WT","WT","WT","WT","MT","MT","MT","MT","MT","MT")
)
cdsFull<-newCountDataSet(data,Design)
cdsFull<-estimateSizeFactors(cdsFull)
cdsFull<-estimateDispersions(cdsFull)
#fit with the mouse and the drug
experimento<-fitNbinomGLMs(cdsFull,count ~ mouseType + treatment)
#fit with the mouse + drug + interaction from mouse:drug
experimento_todos_factores<-fitNbinomGLMs(cdsFull,count ~ mouseType +
treatment + mouseType:treatment)
pvalsGLM<-nbinomGLMTest(experimento_todos_factores,experimento)
padjGLM<-p.adjust(pvalsGLM,method="BH")
experimento$pval<-pvalsGLM
experimento$adj.pval<-padjGLM
This gives me 21 DE miRNAs.
As I'm not really sure if this design is correct. I've never seen
something like this. So I've also used the edgeR package using the
example 4.4 in the vignette.
library(edgeR)
Mouse<-factor(c("WT","WT","WT","WT","WT","WT","MT","MT","MT","MT","MT"
,"MT"))
Treatment<-factor(c("Untreated","Untreated","Untreated","Treated","Tre
ated","Treated","Untreated","Untreated","Untreated","Treated","Treated
","Treated"))
data.frame(Sample=colnames(y),Mouse,Treatment)
design<-model.matrix(~Mouse+Treatment)
rownames(design)<-colnames(y)
y<-estimateGLMCommonDisp(y,design,verbose=TRUE)
#Estimation of the gene-wise dispersion
y<-estimateGLMTrendedDisp(y,design)
y<-estimateGLMTagwiseDisp(y,design)
#Diff expresion
fit<-glmFit(y,design)
lrt<-glmLRT(fit)
topedgeR<-topTags(lrt,n=100)
So I guess that I'm testing the drug adjusting for baseline
differences between the 2 mouse types. And I have 26 DE miRNAs
The problem here is that there is only 5 common miRNAs between DESeq
and edgeR.
Is the design correct ?what I'm doing wrong ?
Thanks in advance !
[[alternative HTML version deleted]]