Dear ensembldb maintainers,
First, thanks a lot for this great resource!
I have a question regarding the "gene description" field. It seems to me that it is not accessible from ensembldb, at least I couldn't find it in the available "columns"... For example, for the gene "Cntnap1" I would like to retrieve the following field: "contactin associated protein-like 1 [Source:MGI Symbol;Acc:MGI:1858201]" (see http://www.ensembl.org/Mus_musculus/Gene/Summary?db=core;g=ENSMUSG00000017167)
Below is what I tried, am I missing something?
library(AnnotationHub)
ah <- AnnotationHub()
ahDb <- query(ah, "Ensembl 88 EnsDb for Mus musculus")
edb <- ahDb[[1]]
columns(edb)
[1] "ENTREZID" "EXONID" "EXONIDX" "EXONSEQEND" "EXONSEQSTART" "GENEBIOTYPE"
[7] "GENEID" "GENENAME" "GENESEQEND" "GENESEQSTART" "INTERPROACCESSION" "ISCIRCULAR"
[13] "PROTDOMEND" "PROTDOMSTART" "PROTEINDOMAINID" "PROTEINDOMAINSOURCE" "PROTEINID" "PROTEINSEQUENCE"
[19] "SEQCOORDSYSTEM" "SEQLENGTH" "SEQNAME" "SEQSTRAND" "SYMBOL" "TXBIOTYPE"
[25] "TXCDSSEQEND" "TXCDSSEQSTART" "TXID" "TXNAME" "TXSEQEND" "TXSEQSTART"
[31] "UNIPROTDB" "UNIPROTID" "UNIPROTMAPPINGTYPE"
Here is my sessionInfo()
R version 3.4.0 (2017-04-21)
Platform: x86_64-apple-darwin15.6.0 (64-bit)
Running under: macOS Sierra 10.12.5
Matrix products: default
BLAS: /Library/Frameworks/R.framework/Versions/3.4/Resources/lib/libRblas.0.dylib
LAPACK: /Library/Frameworks/R.framework/Versions/3.4/Resources/lib/libRlapack.dylib
locale:
[1] C
attached base packages:
[1] parallel stats graphics grDevices utils datasets methods
[8] base
other attached packages:
[1] AnnotationHub_2.8.1 BiocGenerics_0.22.0
loaded via a namespace (and not attached):
[1] Rcpp_0.12.11 IRanges_2.10.2
[3] digest_0.6.12 mime_0.5
[5] R6_2.2.1 xtable_1.8-2
[7] DBI_0.6-1 stats4_3.4.0
[9] RSQLite_1.1-2 BiocInstaller_1.26.0
[11] httr_1.2.1 S4Vectors_0.14.2
[13] Biobase_2.36.2 shiny_1.0.3
[15] httpuv_1.3.3 yaml_2.1.14
[17] compiler_3.4.0 AnnotationDbi_1.38.0
[19] memoise_1.1.0 htmltools_0.3.6
[21] interactiveDisplayBase_1.14.0