The ExperimentHub server provides easy R / Bioconductor access to
large files of data.
The ExperimentHub package provides a client interface to resources stored at the ExperimentHub web service. It has similar functionality to AnnotationHub package.
library(ExperimentHub)The ExperimentHub package is straightforward to use.
Create an ExperimentHub object
eh = ExperimentHub()Now at this point you have already done everything you need in order
to start retrieving experiment data. For most operations, using the
ExperimentHub object should feel a lot like working with a familiar
list or data.frame and has all of the functionality of an Hub
object like AnnotationHub package’s AnnotationHub
object.
Lets take a minute to look at the show method for the hub object eh
eh## ExperimentHub with 7282 records
## # snapshotDate(): 2023-10-24
## # $dataprovider: Eli and Edythe L. Broad Institute of Harvard and MIT, NCBI,...
## # $species: Homo sapiens, Mus musculus, Saccharomyces cerevisiae, human gut ...
## # $rdataclass: SummarizedExperiment, ExpressionSet, matrix, character, list,...
## # additional mcols(): taxonomyid, genome, description,
## #   coordinate_1_based, maintainer, rdatadateadded, preparerclass, tags,
## #   rdatapath, sourceurl, sourcetype 
## # retrieve records with, e.g., 'object[["EH1"]]' 
## 
##            title                                                              
##   EH1    | RNA-Sequencing and clinical data for 7706 tumor samples from The...
##   EH166  | ERR188297                                                          
##   EH167  | ERR188088                                                          
##   EH168  | ERR188204                                                          
##   EH169  | ERR188317                                                          
##   ...      ...                                                                
##   EH8530 | cao_esophageal_transcript_counts                                   
##   EH8531 | mcrpc_transcript_counts                                            
##   EH8532 | cpgea_transcript_counts                                            
##   EH8533 | tcga_transcript_counts                                             
##   EH8534 | target_rhabdoid_wgbs_hg19You can see that it gives you an idea about the different types of data that are present inside the hub. You can see where the data is coming from (dataprovider), as well as what species have samples present (species), what kinds of R data objects could be returned (rdataclass). We can take a closer look at all the kinds of data providers that are available by simply looking at the contents of dataprovider as if it were the column of a data.frame object like this:
head(unique(eh$dataprovider))## [1] "GEO"                                                                                                                                          
## [2] "GEUVADIS"                                                                                                                                     
## [3] "Allen Brain Atlas"                                                                                                                            
## [4] "ArrayExpress"                                                                                                                                 
## [5] "Department of Psychology, Abdul Haq Campus, Federal Urdu University for Arts, Science and Technology, Karachi, Pakistan. shahiq_psy@yahoo.com"
## [6] "Department of Chemical and Biological Engineering, Chalmers University of Technology, SE-412 96 Gothenburg, Sweden."In the same way, you can also see data from different species inside the hub by looking at the contents of species like this:
head(unique(eh$species))## [1] "Homo sapiens"            "Mus musculus"           
## [3] "Mus musculus (E18 mice)" NA                       
## [5] "Rattus norvegicus"       "human gut metagenome"And this will also work for any of the other types of metadata present. You can learn which kinds of metadata are available by simply hitting the tab key after you type ‘eh$’. In this way you can explore for yourself what kinds of data are present in the hub right from the command line. This interface also allows you to access the hub programmatically to extract data that matches a particular set of criteria.
Another valuable types of metadata to pay attention to is the rdataclass.
head(unique(eh$rdataclass))## [1] "ExpressionSet"              "GAlignmentPairs"           
## [3] "CellMapperList"             "gds.class"                 
## [5] "RangedSummarizedExperiment" "GRanges"The rdataclass allows you to see which kinds of R objects the hub will return to you. This kind of information is valuable both as a means to filter results and also as a means to explore and learn about some of the kinds of ExperimentHub objects that are widely available for the project. Right now this is a pretty short list, but over time it should grow as we support more of the different kinds of ExperimentHub objects via the hub.
Now let’s try getting the data files associated with the r Biocpkg("alpineData") package using the query method. The query method lets you
search rows for specific strings, returning an ExperimentHub instance with
just the rows matching the query. The ExperimentHub::package() function
indicates the package responsible for original preparation and documentation of
the ExperimentHub data, and is a useful resource to find out more about the
data. This package may also depend, import or suggest other packages required
for manipulating the data, and for this reason the package may need to be
installed and loaded to use the resource. The package is also available in the
(cryptically named) preparerclass column of the metadata of the ExperimentHub
object.
One can get chain files for Drosophila melanogaster from UCSC with:
apData <- query(eh, "alpineData")
apData## ExperimentHub with 4 records
## # snapshotDate(): 2023-10-24
## # $dataprovider: GEUVADIS
## # $species: Homo sapiens
## # $rdataclass: GAlignmentPairs
## # additional mcols(): taxonomyid, genome, description,
## #   coordinate_1_based, maintainer, rdatadateadded, preparerclass, tags,
## #   rdatapath, sourceurl, sourcetype 
## # retrieve records with, e.g., 'object[["EH166"]]' 
## 
##           title    
##   EH166 | ERR188297
##   EH167 | ERR188088
##   EH168 | ERR188204
##   EH169 | ERR188317Query has worked and you can now see that the only data present is provided by the alpineData package.
The metadata underlying this hub object can be retrieved by you
apData$preparerclass## [1] "alpineData" "alpineData" "alpineData" "alpineData"df <- mcols(apData)By default the show method will only display the first 5 and last 5 rows. There are hundreds of records present in the hub.
length(eh)## [1] 7282Let’s look at another example, where we pull down only data from the hub for species “mus musculus”.
mm <- query(eh, "mus musculus")
mm## ExperimentHub with 1600 records
## # snapshotDate(): 2023-10-24
## # $dataprovider: Jonathan Griffiths, The Tabula Muris Consortium, GEO, Mike ...
## # $species: Mus musculus, Mus musculus (E18 mice)
## # $rdataclass: character, matrix, DFrame, H5File, data.frame, SummarizedExpe...
## # additional mcols(): taxonomyid, genome, description,
## #   coordinate_1_based, maintainer, rdatadateadded, preparerclass, tags,
## #   rdatapath, sourceurl, sourcetype 
## # retrieve records with, e.g., 'object[["EH173"]]' 
## 
##            title                                                              
##   EH173  | Pre-processed microarray data from the Affymetrix MG-U74Av2 plat...
##   EH552  | st100k                                                             
##   EH553  | st400k                                                             
##   EH557  | tasicST6                                                           
##   EH1039 | Brain scRNA-seq data, 'HDF5-based 10X Genomics' format             
##   ...      ...                                                                
##   EH8299 | msigdb.v7.5.1.mm.SYM                                               
##   EH8313 | rse_gene_mouse_RNAseq_nic-smo                                      
##   EH8314 | rse_tx_mouse_RNAseq_nic-smo                                        
##   EH8315 | rse_jx_mouse_RNAseq_nic-smo                                        
##   EH8316 | rse_exon_mouse_RNAseq_nic-smoWe can perform the same query using the BiocHubsShiny() function from the
eponymous package. In the ‘species’ field we can enter musculus as the
search term.
BiocHubsShiny::BiocHubsShiny()
Figure 1: BiocHubsShiny query with species term ‘musculus’
ExperimentHub to retrieve dataLooking back at our alpineData file example, if we are interested in the first file, we can get its metadata using
apData## ExperimentHub with 4 records
## # snapshotDate(): 2023-10-24
## # $dataprovider: GEUVADIS
## # $species: Homo sapiens
## # $rdataclass: GAlignmentPairs
## # additional mcols(): taxonomyid, genome, description,
## #   coordinate_1_based, maintainer, rdatadateadded, preparerclass, tags,
## #   rdatapath, sourceurl, sourcetype 
## # retrieve records with, e.g., 'object[["EH166"]]' 
## 
##           title    
##   EH166 | ERR188297
##   EH167 | ERR188088
##   EH168 | ERR188204
##   EH169 | ERR188317apData["EH166"]## ExperimentHub with 1 record
## # snapshotDate(): 2023-10-24
## # names(): EH166
## # package(): alpineData
## # $dataprovider: GEUVADIS
## # $species: Homo sapiens
## # $rdataclass: GAlignmentPairs
## # $rdatadateadded: 2016-07-21
## # $title: ERR188297
## # $description: Subset of aligned reads from sample ERR188297
## # $taxonomyid: 9606
## # $genome: GRCh38
## # $sourcetype: FASTQ
## # $sourceurl: ftp://ftp.sra.ebi.ac.uk/vol1/fastq/ERR188/ERR188297/ERR188297_...
## # $sourcesize: NA
## # $tags: c("Sequencing", "RNASeq", "GeneExpression", "Transcription") 
## # retrieve record with 'object[["EH166"]]'We can download the file using
apData[["EH166"]]## Bioconductor version 3.18 (BiocManager 1.30.22), R 4.3.1 (2023-06-16)## Installing package(s) 'alpineData'## Warning: package 'alpineData' is not available for Bioconductor version '3.18'
## 
## A version of this package for your version of R might be available elsewhere,
## see the ideas at
## https://cran.r-project.org/doc/manuals/r-patched/R-admin.html#Installing-packages## loading from cache## require("GenomicAlignments")## GAlignmentPairs object with 25531 pairs, strandMode=1, and 0 metadata columns:
##           seqnames strand   :              ranges  --              ranges
##              <Rle>  <Rle>   :           <IRanges>  --           <IRanges>
##       [1]        1      +   : 108560389-108560463  -- 108560454-108560528
##       [2]        1      -   : 108560454-108560528  -- 108560383-108560457
##       [3]        1      +   : 108560534-108600608  -- 108600626-108606236
##       [4]        1      -   : 108569920-108569994  -- 108569825-108569899
##       [5]        1      -   : 108587954-108588028  -- 108587881-108587955
##       ...      ...    ... ...                 ... ...                 ...
##   [25527]        X      +   : 119790596-119790670  -- 119790717-119790791
##   [25528]        X      +   : 119790988-119791062  -- 119791086-119791160
##   [25529]        X      +   : 119791037-119791111  -- 119791142-119791216
##   [25530]        X      +   : 119791348-119791422  -- 119791475-119791549
##   [25531]        X      +   : 119791376-119791450  -- 119791481-119791555
##   -------
##   seqinfo: 194 sequences from an unspecified genomeEach file is retrieved from the ExperimentHub server and the file is also cached locally, so that the next time you need to retrieve it, it should download much more quickly.
ExperimentHub objectsWhen you create the ExperimentHub object, it will set up the object
for you with some default settings. See ?ExperimentHub for ways to
customize the hub source, the local cache, and other instance-specific
options, and ?getExperimentHubOption to get or set package-global
options for use across sessions.
If you look at the object you will see some helpful information about it such as where the data is cached and where online the hub server is set to.
eh## ExperimentHub with 7282 records
## # snapshotDate(): 2023-10-24
## # $dataprovider: Eli and Edythe L. Broad Institute of Harvard and MIT, NCBI,...
## # $species: Homo sapiens, Mus musculus, Saccharomyces cerevisiae, human gut ...
## # $rdataclass: SummarizedExperiment, ExpressionSet, matrix, character, list,...
## # additional mcols(): taxonomyid, genome, description,
## #   coordinate_1_based, maintainer, rdatadateadded, preparerclass, tags,
## #   rdatapath, sourceurl, sourcetype 
## # retrieve records with, e.g., 'object[["EH1"]]' 
## 
##            title                                                              
##   EH1    | RNA-Sequencing and clinical data for 7706 tumor samples from The...
##   EH166  | ERR188297                                                          
##   EH167  | ERR188088                                                          
##   EH168  | ERR188204                                                          
##   EH169  | ERR188317                                                          
##   ...      ...                                                                
##   EH8530 | cao_esophageal_transcript_counts                                   
##   EH8531 | mcrpc_transcript_counts                                            
##   EH8532 | cpgea_transcript_counts                                            
##   EH8533 | tcga_transcript_counts                                             
##   EH8534 | target_rhabdoid_wgbs_hg19By default the ExperimentHub object is set to the latest
snapshotData and a snapshot version that matches the version of
Bioconductor that you are using. You can also learn about these data
with the appropriate methods.
snapshotDate(eh)## [1] "2023-10-24"If you are interested in using an older version of a snapshot, you can
list previous versions with the possibleDates() like this:
pd <- possibleDates(eh)
pd##   [1] "2016-02-23" "2016-06-07" "2016-07-14" "2016-07-21" "2016-08-08"
##   [6] "2016-10-01" "2017-06-09" "2017-08-25" "2017-10-06" "2017-10-10"
##  [11] "2017-10-12" "2017-10-16" "2017-10-19" "2017-10-26" "2017-10-30"
##  [16] "2017-10-29" "2018-01-08" "2018-02-02" "2018-02-09" "2018-02-22"
##  [21] "2018-03-16" "2018-03-30" "2018-04-02" "2018-04-10" "2018-04-20"
##  [26] "2018-04-25" "2018-04-26" "2018-04-27" "2018-05-02" "2018-05-08"
##  [31] "2018-06-29" "2018-07-30" "2018-08-02" "2018-08-03" "2018-08-27"
##  [36] "2018-08-29" "2018-09-07" "2018-09-11" "2018-09-19" "2018-09-20"
##  [41] "2018-10-30" "2018-11-02" "2018-11-05" "2018-11-13" "2018-12-12"
##  [46] "2018-12-13" "2018-12-19" "2018-12-20" "2019-01-02" "2019-01-09"
##  [51] "2019-01-15" "2019-01-25" "2019-03-21" "2019-04-01" "2019-04-15"
##  [56] "2019-04-23" "2019-04-25" "2019-04-26" "2019-04-29" "2019-05-28"
##  [61] "2019-05-29" "2019-06-11" "2019-06-20" "2019-06-28" "2019-07-01"
##  [66] "2019-07-02" "2019-07-10" "2019-08-01" "2019-08-02" "2019-08-06"
##  [71] "2019-08-07" "2019-08-13" "2019-09-04" "2019-09-09" "2019-09-11"
##  [76] "2019-09-25" "2019-10-17" "2019-10-18" "2019-10-22" "2019-12-17"
##  [81] "2019-12-27" "2020-01-08" "2020-02-11" "2020-02-12" "2020-03-09"
##  [86] "2020-03-12" "2020-04-03" "2020-04-27" "2020-05-11" "2020-05-14"
##  [91] "2020-05-19" "2020-05-29" "2020-06-11" "2020-06-26" "2020-07-02"
##  [96] "2020-07-10" "2020-07-29" "2020-08-03" "2020-08-04" "2020-08-05"
## [101] "2020-08-17" "2020-08-24" "2020-08-26" "2020-08-31" "2020-09-03"
## [106] "2020-09-04" "2020-09-08" "2020-09-09" "2020-09-10" "2020-09-14"
## [111] "2020-09-23" "2020-09-24" "2020-10-02" "2020-10-30" "2020-11-05"
## [116] "2020-11-18" "2020-11-25" "2020-12-02" "2020-12-03" "2020-12-07"
## [121] "2020-12-09" "2020-12-14" "2021-01-04" "2020-10-27" "2021-01-12"
## [126] "2021-01-19" "2021-01-20" "2021-01-27" "2021-01-28" "2021-02-08"
## [131] "2021-02-11" "2021-02-19" "2021-03-02" "2021-03-04" "2021-03-10"
## [136] "2021-03-18" "2021-03-22" "2021-03-23" "2021-03-24" "2021-03-30"
## [141] "2021-04-06" "2021-04-08" "2021-04-27" "2021-05-04" "2021-05-05"
## [146] "2021-05-18" "2021-06-14" "2021-06-16" "2021-06-21" "2021-07-15"
## [151] "2021-07-16" "2021-07-27" "2021-07-30" "2021-08-03" "2021-08-09"
## [156] "2021-04-26" "2021-08-18" "2021-08-26" "2021-08-27" "2021-09-13"
## [161] "2021-09-23" "2021-09-24" "2021-10-05" "2021-10-06" "2021-10-15"
## [166] "2021-10-18" "2021-10-19" "2021-11-24" "2022-01-04" "2022-01-20"
## [171] "2022-02-15" "2022-02-22" "2022-02-28" "2022-03-01" "2022-03-16"
## [176] "2022-03-29" "2022-04-04" "2022-04-06" "2022-04-19" "2022-04-26"
## [181] "2022-05-17" "2022-06-15" "2022-06-29" "2022-07-08" "2022-07-15"
## [186] "2022-07-22" "2022-08-16" "2022-08-23" "2022-10-03" "2022-10-17"
## [191] "2022-10-24" "2022-10-31" "2022-12-13" "2022-12-16" "2023-01-04"
## [196] "2023-01-13" "2023-01-20" "2023-01-30" "2023-02-08" "2023-02-14"
## [201] "2023-03-13" "2023-03-21" "2023-03-29" "2023-04-04" "2023-04-11"
## [206] "2023-04-12" "2023-04-13" "2023-04-24" "2023-05-15" "2023-05-17"
## [211] "2023-06-01" "2023-06-20" "2023-07-03" "2023-07-05" "2023-07-18"
## [216] "2023-07-21" "2023-08-02" "2023-08-22" "2023-08-28" "2023-09-18"
## [221] "2023-09-21" "2023-09-26" "2023-09-29" "2023-10-03" "2023-10-06"
## [226] "2023-10-13" "2023-10-24" "2023-10-24"Set the dates like this:
snapshotDate(ah) <- pd[1]Please see HubPub Vignette “CreateAHubPackage”.
vignette("CreateAHubPackage", package="HubPub")Please see AnnotationHub vignette “TroubleshootingTheCache”.
vignette("TroubleshootingTheCache", package=AnnotationHub)The ExperimentHub uses CRAN package httr functions HEAD and GET for accessing
web resources. This can be problematic if operating behind a proxy. The easiest
solution is to set the httr::set_config with the proxy information.
proxy <- httr::use_proxy("http://my_user:my_password@myproxy:8080")
## or
proxy <- httr::use_proxy(Sys.getenv('http_proxy'))
httr::set_config(proxy)
ExperimentHub::setExperimentHubOption("PROXY", proxy)The situation may occur where a hub is desired to be shared across multiple
users on a system. This presents permissions errors. To allow access to
multiple users create a group that the users belong to and that the underlying
hub cache belongs too. Permissions of potentially two files need to be altered depending
on what you would like individuals to be able to accomplish with the hub. A
read-only hub will require manual manipulatios of the file
BiocFileCache.sqlite.LOCK so that the group permissions are g+rw. To allow
users to download files to the shared hub, both the
BiocFileCache.sqlite.LOCK file and the BiocFileCache.sqlite file will need group
permissions to g+rw. Please google how to create a user group for your system
of interest. To find the location of the hub cache to be able to change the group
and file permissions, you may run the following in R eh = ExperimentHub(); hubCache(eh). For quick reference in linux you will use chown currentuser:newgroup to change the group and chmod to change the file
permissions: chmod 660 or chmod g+rw should accomplish the correct
permissions.
As of ExperimentHub version > 1.17.2, the default caching location has
changed. The default cache is now controlled by the function tools::R_user_dir
instead of rappdirs::user_cache_dir. Users who have utilized the default
ExperimentHub location, to continue using the created cache, must move the cache and its
files to the new default location, create a system environment variable to
point to the old location, or delete and start a new cache.
The following steps can be used to move the files to the new location:
Determine the old location by running the following in R
rappdirs::user_cache_dir(appname="ExperimentHub")
Determine the new location by running the following in R
tools::R_user_dir("ExperimentHub", which="cache")
Move the files to the new location. You can do this manually or do the following steps in R. Remember if you have a lot of cached files, this may take awhile.
       # make sure you have permissions on the cache/files
       # use at own risk
       moveFiles<-function(package){
       olddir <- path.expand(rappdirs::user_cache_dir(appname=package))
       newdir <- tools::R_user_dir(package, which="cache")
       dir.create(path=newdir, recursive=TRUE)
       files <- list.files(olddir, full.names =TRUE)
       moveres <- vapply(files,
           FUN=function(fl){
           filename = basename(fl)
           newname = file.path(newdir, filename)
           file.rename(fl, newname)
           },
           FUN.VALUE = logical(1))
       if(all(moveres)) unlink(olddir, recursive=TRUE)
       }
       package="ExperimentHub"
       moveFiles(package)A user may set the system environment variable EXPERIMENT_HUB_CACHE to control
the default location of the cache. Setting system environment variables can vary
depending on the operating system; we suggest using google to find appropriate
instructions per your operating system.
You will want to set the variable to the results of running the following in R:
path.expand(rappdirs::user_cache_dir(appname="ExperimentHub"))NOTE: R has Sys.setenv however that will only set the variable for that R
session. It would not be available or recognized in future R sessions. It is
important to set the variable as a global user-wide or system-wide
environment variable so it persists in all future logins to your system.
Lastly, if a user does not care about the already existing default cache, the old location may be deleted to move forward with the new default location. This option should be used with caution. Once deleted, old cached resources will no longer be available and have to be re-downloaded.
One can do this manually by navigating to the location indicated in the ERROR
message as Problematic cache: and deleting the folder and all its content.
The following can be done to delete through R code:
CAUTION This will remove the old cache and all downloaded resources. All resources will have to be re-downloaded after executing this code.
library(ExperimentHub)
oldcache = path.expand(rappdirs::user_cache_dir(appname="ExperimentHub"))
setExperimentHubOption("CACHE", oldcache)
eh = ExperimentHub(localHub=TRUE)
## removes old location and all resources
removeCache(eh, ask=FALSE)
## create the new default caching location
newcache = tools::R_user_dir("ExperimentHub", which="cache")
setExperimentHubOption("CACHE", newcache)
eh = ExperimentHub()sessionInfo()## R version 4.3.1 (2023-06-16)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.18-bioc/R/lib/libRblas.so 
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.10.0
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_GB              LC_COLLATE=C              
##  [5] LC_MONETARY=en_US.UTF-8    LC_MESSAGES=en_US.UTF-8   
##  [7] LC_PAPER=en_US.UTF-8       LC_NAME=C                 
##  [9] LC_ADDRESS=C               LC_TELEPHONE=C            
## [11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C       
## 
## time zone: America/New_York
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] GenomicAlignments_1.38.0    Rsamtools_2.18.0           
##  [3] Biostrings_2.70.0           XVector_0.42.0             
##  [5] SummarizedExperiment_1.32.0 Biobase_2.62.0             
##  [7] MatrixGenerics_1.14.0       matrixStats_1.0.0          
##  [9] GenomicRanges_1.54.0        GenomeInfoDb_1.38.0        
## [11] IRanges_2.36.0              S4Vectors_0.40.0           
## [13] ExperimentHub_2.10.0        AnnotationHub_3.10.0       
## [15] BiocFileCache_2.10.0        dbplyr_2.3.4               
## [17] BiocGenerics_0.48.0         BiocStyle_2.30.0           
## 
## loaded via a namespace (and not attached):
##  [1] tidyselect_1.2.0              dplyr_1.1.3                  
##  [3] blob_1.2.4                    filelock_1.0.2               
##  [5] bitops_1.0-7                  fastmap_1.1.1                
##  [7] RCurl_1.98-1.12               promises_1.2.1               
##  [9] digest_0.6.33                 mime_0.12                    
## [11] lifecycle_1.0.3               ellipsis_0.3.2               
## [13] KEGGREST_1.42.0               interactiveDisplayBase_1.40.0
## [15] RSQLite_2.3.1                 magrittr_2.0.3               
## [17] compiler_4.3.1                rlang_1.1.1                  
## [19] sass_0.4.7                    tools_4.3.1                  
## [21] utf8_1.2.4                    yaml_2.3.7                   
## [23] knitr_1.44                    S4Arrays_1.2.0               
## [25] bit_4.0.5                     curl_5.1.0                   
## [27] DelayedArray_0.28.0           BiocParallel_1.36.0          
## [29] abind_1.4-5                   withr_2.5.1                  
## [31] purrr_1.0.2                   grid_4.3.1                   
## [33] fansi_1.0.5                   xtable_1.8-4                 
## [35] cli_3.6.1                     rmarkdown_2.25               
## [37] crayon_1.5.2                  generics_0.1.3               
## [39] httr_1.4.7                    DBI_1.1.3                    
## [41] cachem_1.0.8                  zlibbioc_1.48.0              
## [43] parallel_4.3.1                AnnotationDbi_1.64.0         
## [45] BiocManager_1.30.22           vctrs_0.6.4                  
## [47] Matrix_1.6-1.1                jsonlite_1.8.7               
## [49] bookdown_0.36                 bit64_4.0.5                  
## [51] jquerylib_0.1.4               glue_1.6.2                   
## [53] codetools_0.2-19              BiocVersion_3.18.0           
## [55] later_1.3.1                   tibble_3.2.1                 
## [57] pillar_1.9.0                  rappdirs_0.3.3               
## [59] htmltools_0.5.6.1             GenomeInfoDbData_1.2.11      
## [61] R6_2.5.1                      evaluate_0.22                
## [63] shiny_1.7.5.1                 lattice_0.22-5               
## [65] png_0.1-8                     memoise_2.0.1                
## [67] httpuv_1.6.12                 bslib_0.5.1                  
## [69] Rcpp_1.0.11                   SparseArray_1.2.0            
## [71] xfun_0.40                     pkgconfig_2.0.3