I spent many hours trying to find this answer, but alas to no avail. I have somalogic proteomics data normalized. I have 2 groups (test and control) I want to find the differential expression between those groups.
Normally for RNAseq I would do something like below.
Can someone show me exactly have to change the code used for RNAseq for proteomics.
Thank you very much in advance!
contr.matrix <- makeContrasts(
res = test - control,
levels = colnames(design))
contr.matrix
vfit <- lmFit(v, design)
vfit <- contrasts.fit(vfit, contrasts=contr.matrix)
efit <- eBayes(vfit)
as.data.frame(topTable(efit,coef = 1,number=Inf))
Thank you when I compare doing a Wilcoxon test Wilcox.test() with the Limma code above. I get ~ dozen of proteins that was significant and had been previously reported running Wilcoxon.test while running Limma with the above code gives zero proteins p.adj < 0.05. I was hoping to see Limma pro be just as sensitive or even more sensitive than Wilcoxon test. Do you think filtering out non-variable proteins ? and what code would you recommend to run here to improve the power of running Limma.
I did check those plots plotSA and plotMD and they both appear to be 'OK'
Thank you in advance.
Assuming that the underlying assumptions for limma are met (which you are checking with
plotSA
andplotMD
and could also useplotMDS
to look for outlier samples), the model you fit with limma is more powerful than a Wilcoxon. So if you are getting significant results with a Wilcoxon and not with limma, then I would imagine that your data don't meet the assumptions of one or the other. Or perhaps you are not adjusting the Wilcoxon p-values for multiplicity, which limma is doing. If that is the case then you are not making a fair comparison.This site is mainly intended to help people with technical issues with the packages, rather than helping with analyses, so I am afraid I can't help much more.