Entering edit mode
corentin.lyon
•
0
@corentinlyon-22056
Last seen 5.4 years ago
I run DESeq2 using lfcShrink to get LFC estimates:
resLFC <- lfcShrink(dds, coef="condition_T_vs_O", type="apeglm",lfcThreshold = 1,svalue = TRUE)
I then want to plot a volcanoplot using svalues:
ggplot(as.data.frame(resLFC), aes(x=log2FoldChange, y=-log10(svalue),color=svalue<0.005)) +xlab("log2(Fold Change)")+ylab("-log10(svalue)")+theme(legend.position="none")+
geom_point()+theme_bw()+scale_color_manual(values=c("#1d1d0a","#9a3348"))
Why in O condition, almost all the svalues are set to 0 for negative LFC genes? And not for positive LFC genes?
Ok this makes sense, Last thing I am not sure to understand, to have a FDR of 1% should I use a treshold on 0.01 padj or 0.01 svalue?
Adjusted pvalue gives FDR (with method of BH).