This package defines an AnnotationHub resource representing multiple ontologies.

library(AnnotationHub)
## Loading required package: BiocGenerics
## 
## Attaching package: 'BiocGenerics'
## The following objects are masked from 'package:stats':
## 
##     IQR, mad, sd, var, xtabs
## The following objects are masked from 'package:base':
## 
##     Filter, Find, Map, Position, Reduce, anyDuplicated, append,
##     as.data.frame, basename, cbind, colnames, dirname, do.call,
##     duplicated, eval, evalq, get, grep, grepl, intersect, is.unsorted,
##     lapply, mapply, match, mget, order, paste, pmax, pmax.int, pmin,
##     pmin.int, rank, rbind, rownames, sapply, setdiff, sort, table,
##     tapply, union, unique, unsplit, which.max, which.min
## Loading required package: BiocFileCache
## Loading required package: dbplyr
ahub = AnnotationHub()
## snapshotDate(): 2021-10-20
mymeta <- query(ahub , "ontoProcData")
mymeta
## AnnotationHub with 15 records
## # snapshotDate(): 2021-10-20
## # $dataprovider: NA
## # $species: NA
## # $rdataclass: Rda
## # additional mcols(): taxonomyid, genome, description,
## #   coordinate_1_based, maintainer, rdatadateadded, preparerclass, tags,
## #   rdatapath, sourceurl, sourcetype 
## # retrieve records with, e.g., 'object[["AH97934"]]' 
## 
##             title           
##   AH97934 | caro            
##   AH97935 | cellLineOnto    
##   AH97936 | cellOnto        
##   AH97937 | cellosaurusOnto 
##   AH97938 | chebi_full      
##   ...       ...             
##   AH97944 | oncotree        
##   AH97945 | patoOnto        
##   AH97946 | Pronto          
##   AH97947 | uberon          
##   AH97948 | mondo_2021_04_07
tag = names(mymeta)[1] 
tag
## [1] "AH97934"