Entering edit mode
colnames(fit2)
ct <- 1
volcanoplot(fit2, coef=ct, main=colnames(fit2)[ct], pch=20,
highlight=length(which(dT[,ct]!=0)), names=rep('+', nrow(fit2)))
library(dplyr)
ggplot(fit2) +
geom_point(aes(log2FC,logpv,col= diffexpressed)) +
geom_text_repel(data = fit2 %>%
filter(Genes %in% c("klf6", "podxl", "gng7", "tusc3", "bag4", "gcnt2", "scp2", "podxl2", "nrxn1", "tnfrsf8", "cd14, gyg1,))"alox5ap", "plat", "tpp1", "oasl", "spock1", "ivd", "tinagli", "acaa2")),
aes(label = Genes, x = log2FC, y = P.Value), box.padding = unit(.7, "lines"),hjust= 0.30) +
scale_color_manual(values=c("red", "blue"))
