I have single cell RNA seq data from two groups. When I use DESeq2 to explore differential regulation between the two groups, I visualize them in a plotMA graph. To my surprise this shows most genes are not around 0 for the y-axe (log2Fold) but -1. I added a link to the plot I made. What am I doing wrong?
library(DESeq2)
# g1 = cell names group 1
# g2 = cell names group 2
# x = data frame with unique reads (raw) of all cells
x <- x[,c(g1,g2)]
x <- x[!grepl("ERCC",row.names(x))&!grepl("Rn45s", row.names(x)),]
des <- data.frame(row.names=colnames(x),
condition= c(rep("con1",length(g1)),
rep("con2",length(g2))))
dds <- DESeqDataSetFromMatrix(
countData = round(x,0),
colData = des,
design = ~ condition)
dds <- DESeq(dds)
res <- results(dds)
plotMA(res, ylim = c(min(res$log2FoldChange, na.rm = TRUE), max(res$log2FoldChange, na.rm = TRUE)))