missMethyl: Gene ontology analysis
3
2
Entering edit mode
philipp24 ▴ 30
@philipp24-8672
Last seen 7.5 years ago
Germany

Dear all,

​I use the missMethyl package with the gometh and gsameth function to analyze whether significantly differentially methylated CpG sites are enriched in gene sets. 

gometh can either analyze GO or KEGG genesets, whereas gsameth is a more generalized version where one can manually specify the genesets to be analyzed. In my analysis I used both gometh and gsameth with the KEGG genesets; for gometh KEGG can be specified automatically; whereas for gsameth I downloaded the KEGG genesets from the Broadinstitute via http://software.broadinstitute.org/gsea/msigdb/genesets.jsp?collection=C2. I perform analysis with the following code:

library(devtools)
install_github("Bioconductor-mirror/missMethyl")
library(BAGS)
library(missMethyl)

#read C2 CP gmt file downlaoded from http://software.broadinstitute.org/gsea/msigdb/genesets.jsp?collection=C2
MSigDB_C2_CP <- ReadGMT("./data/c2.cp.v5.1.entrez.gmt")
#only keep KEGG pathways
MSigDB_C2_CP_KEGG <- MSigDB_C2_CP[grepl('^KEGG', names(MSigDB_C2_CP))]
#perform gsameth
gsa.MSigDB <- gsameth(sig.cpg=rownames(sigDMP), all.cpg=rownames(GRset_work), collection=MSigDB_C2_CP_KEGG)
Warning message:
In alias2SymbolTable(flat$symbol) :
  Multiple symbols ignored for one or more aliases
#sort by FDR p-value & only keep <0.05
gsa.MSigDB <- as.data.frame(gsa.MSigDB[order(gsa.MSigDB[,4]),])
sigMSigDB <- gsa.MSigDB[gsa.MSigDB$FDR<0.05,]

#perform gometh
gst.KEGG <- gometh(sig.cpg=rownames(sigDMP), all.cpg=rownames(GRset_work), collection="KEGG")
Warning message:
In alias2SymbolTable(flat$symbol) :
  Multiple symbols ignored for one or more aliases

#sort by FDR p-value & only keep <0.05

gst.KEGG <- gst.KEGG[order(gst.KEGG$FDR),]
sigKEGG <- gst.KEGG[gst.KEGG$FDR<0.05,]

#results:
sprintf("gsameth with C2 Curated Pathways of KEGG: %s / %s",NROW(sigMSigDB), NROW(gsa.MSigDB))
[1] "gsameth with C2 Curated Pathways of KEGG: 2 / 186"
sprintf("gometh with KEGG: %s / %s",NROW(sigKEGG), NROW(gst.KEGG))
[1] "gometh with KEGG: 133 / 301"

First, I wonder why the number of total genesets differs: 186 if I manually download the KEGG genesets from the broad institute for gsameth and 301 for gometh if KEGG is specified as collection.

Second, I wonder why the number of significant genesets identified by both methods is so different: 2 for gsameth and 133 for gometh?

Third, what can I do about the warning "Multiple symbols ignored for one or more aliases" - is this worrisome or just a result that not all CpG sites can be mapped to a specific gene? 

Thanks,

Philipp

missMethyl • 3.4k views
ADD COMMENT
1
Entering edit mode
@gordon-smyth
Last seen 2 hours ago
WEHI, Melbourne, Australia

The MSigDB provides an old version of the KEGG database that has been curated by the Broad Institute staff to remove pathways with very few genes.

gometh() on the other hand uses the latest complete version of KEGG. Hence it includes far more sets. (gometh calls kegga in the limma package, and this in turn reads the latest version of KEGG dynamically from the internet every time you run the function.)

Try this:

> k <- limma::getGeneKEGGLinks()
> head(k)
  GeneID     PathwayID
1  10327 path:hsa00010
2    124 path:hsa00010
3    125 path:hsa00010
4    126 path:hsa00010
5    127 path:hsa00010
6    128 path:hsa00010
> table(k$PathwayID)

This counts the number of genes associated with each pathway. You will see that there are 301 KEGG pathways with at least one associated human gene, but 8 of the pathways have fewer than 5 genes associated with them.

ADD COMMENT
0
Entering edit mode
@belindaphipson-6783
Last seen 17 days ago
Australia

Hi Philipp,

I just wanted to add a comment about the warning message. In the mapping of CpGs to gene symbols and subsequently to Entrez GeneIDs, I use the alias2SymbolTable to get the most up to date symbols to map to Entrez GeneID. This function always spits out this warning message, and I don't believe it is something to be concerned about.

Cheers,

Belinda

ADD COMMENT
0
Entering edit mode
philipp24 ▴ 30
@philipp24-8672
Last seen 7.5 years ago
Germany
Alright! Thanks for your helpful answers!
ADD COMMENT

Login before adding your answer.

Traffic: 758 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