Hi All,
I am trying to run a gene ontology analysis using Arabidopsis annotation as reference (available at ""org.At.tair.db""). I am using the edgeR package particularly the function goana however when I specify the species (species=At) the function doesn't recognize the library org.At.tair.db. The coding is below, eny help would be much appreciated:
library(edgeR)
source("https://bioconductor.org/biocLite.R")
biocLite("org.At.tair.db")
library("org.At.tair.db")
x<-read.delim("mygenes.csv", header=TRUE, sep=",")
mylist<-DGEList(counts=x[,3:8], genes=x[,2])
y<-estimateDisp(mylist)
group<-factor(c(1,1,1,2,2,2))
design<-model.matrix(~group)
fit<-glmQLFit(y, design)
qlf <- glmQLFTest(fit, coef=2)
go <- goana(qlf, species="At")
ERROR:
Error in goana.default(de = DEGenes, universe = universe, ...) : org.At.eg.db package required but not not installed (or can't be loaded)
