TopGO Analysis of gene enrichment - enriched terms are not in the original list
0
0
Entering edit mode
pninasmail • 0
@pninasmail-11087
Last seen 7.8 years ago

Hello,

I am running TopGO over a genome that was sequenced, assembled and annotated by my group so I supply my own GO annotation. I am interested to see if there are enriched GO terms in sub-group of genes of this genome and am little confused with TopGo results - because the first 6 best results include GO terms that are not even annotated for this genome, not to mention in the subgroup of genes in this genome. I am using Fisher, classic algorithm. Does TopGO look for enriched GO terms that are not in the list, finding them using GO graph topography?

 

My Code:

library(topGO)

setwd("C:\\pnina\\Studies\\GOSnIPRE")

geneID2GO <- readMappings (file = "my_M1.SINV.gene_GO",sep = "\t", IDsep = ",")

geneUniverse <- names(geneID2GO)

genesOfInterest <- read.table("interestinggenes.txt",header=FALSE)
genesOfInterest <- as.character(genesOfInterest$V1)
geneList <- factor(as.integer(geneUniverse %in% genesOfInterest),levels =c(0,1))

names(geneList) <- geneUniverse

plot(geneList)
#Creating the GO data
SnIPREGO <- new("topGOdata", description="SnIPRE GO", ontology="BP", allGenes=geneList,  annot = annFUN.gene2GO, gene2GO = geneID2GO)

#from here - analysis
resultFisher <- runTest(SnIPREGO, algorithm = "classic", statistic = "fisher")

showSigOfNodes(SnIPREGO, score(resultFisher), firstSigNodes = 6, useInfo = 'all')

 

Thank you,

Pnina

topgo • 905 views
ADD COMMENT

Login before adding your answer.

Traffic: 789 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6