Entering edit mode
I have the following limma code which I wrote(dummy)
The matrix is designed in a way so that I don't use the intercept part.
library(limma)
d <- matrix(rexp(200, rate=.1), ncol=9,nrow = 10)
colnames(d) <- c("A_1","A_2","A_3","B_1","B_2","B_3","C_1","C_2","C_3")
head(d)
design <- model.matrix(~0 + factor(rep(1:3, each=3)))
colnames(design) <- c("A","B","C")
fit <- lmFit(d,design)
contrast.matrix <- makeContrasts(A-B,B-C,A-C,A-(B+C)/2, levels = design)
fit2 <- contrasts.fit(fit, contrast.matrix)
fit2 <- eBayes(fit2)
topTable(fit2,coef = 1,adjust.method = "BH")
In the output of topTable if logFC is positive for contrast A-B does it mean it is log(A/B)?