bugsigdbr 1.10.1
BugSigDB is a manually curated database of microbial signatures from the published literature of differential abundance studies of human and other host microbiomes.
BugSigDB provides:
The bugsigdbr package implements convenient access to BugSigDB from within R/Bioconductor. The goal of the package is to facilitate import of BugSigDB data into R/Bioconductor, provide utilities for extracting microbe signatures, and enable export of the extracted signatures to plain text files in standard file formats such as GMT.
The bugsigdbr package is primarily a data package. For descriptive statistics and comprehensive analysis of BugSigDB contents, please see the BugSigDBStats package and analysis vignette.
We start by loading the package.
library(bugsigdbr)The function importBugSigDB can be used to import the complete collection of
curated signatures from BugSigDB. The dataset is downloaded once and
subsequently cached. Use cache = FALSE to force a fresh download of BugSigDB
and overwrite the local copy in your cache.
bsdb <- importBugSigDB()
dim(bsdb)
#> [1] 3518   50
colnames(bsdb)
#>  [1] "BSDB ID"                    "Study"                     
#>  [3] "Study design"               "PMID"                      
#>  [5] "DOI"                        "URL"                       
#>  [7] "Authors list"               "Title"                     
#>  [9] "Journal"                    "Year"                      
#> [11] "Keywords"                   "Experiment"                
#> [13] "Location of subjects"       "Host species"              
#> [15] "Body site"                  "UBERON ID"                 
#> [17] "Condition"                  "EFO ID"                    
#> [19] "Group 0 name"               "Group 1 name"              
#> [21] "Group 1 definition"         "Group 0 sample size"       
#> [23] "Group 1 sample size"        "Antibiotics exclusion"     
#> [25] "Sequencing type"            "16S variable region"       
#> [27] "Sequencing platform"        "Statistical test"          
#> [29] "Significance threshold"     "MHT correction"            
#> [31] "LDA Score above"            "Matched on"                
#> [33] "Confounders controlled for" "Pielou"                    
#> [35] "Shannon"                    "Chao1"                     
#> [37] "Simpson"                    "Inverse Simpson"           
#> [39] "Richness"                   "Signature page name"       
#> [41] "Source"                     "Curated date"              
#> [43] "Curator"                    "Revision editor"           
#> [45] "Description"                "Abundance in Group 1"      
#> [47] "MetaPhlAn taxon names"      "NCBI Taxonomy IDs"         
#> [49] "State"                      "Reviewer"Each row of the resulting data.frame corresponds to a microbe signature from
differential abundance analysis, i.e. a set of microbes that has been found
with increased or decreased abundance in one sample group when compared to
another sample group (eg. in a case-vs.-control setup).
The curated signatures are richly annotated with additional metadata columns
providing information on study design, antibiotics exclusion criteria,
sample size, and experimental and statistical procedures, among others.
Subsetting the full dataset to certain conditions, body sites, or other
metadata columns of interest can be done along the usual lines for
subsetting data.frames.
For example, the following subset command restricts the dataset to signatures
obtained from microbiome studies on obesity, based on fecal samples from
participants in the US.
us.obesity.feces <- subset(bsdb,
                           `Location of subjects` == "United States of America" &
                           Condition == "obesity" &
                           `Body site` == "feces")Given the full BugSigDB collection (or a subset of interest), the function
getSignatures can be used to obtain the microbes annotated to each signature.
Microbes annotated to a signature are returned following the NCBI Taxonomy nomenclature per default.
sigs <- getSignatures(bsdb)
length(sigs)
#> [1] 3444
sigs[1:3]
#> $`bsdb:1/1/1_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_UP`
#>  [1] "91061"  "1236"   "1654"   "1716"   "1301"   "162289" "189330" "33024" 
#>  [9] "40544"  "2037"   "2049"   "506"    "186826" "1300"   "31977"  "91347" 
#> [17] "1653"   "57037"  "1386"   "186817"
#> 
#> $`bsdb:1/1/2_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_DOWN`
#> [1] "100883" "1117"  
#> 
#> $`bsdb:1/2/1_Hyperplastic-Polyp:hyperplastic-polyp-cases_vs_controls_UP`
#> [1] "207244" "57037"It is also possible obtain signatures based on the full taxonomic classification in MetaPhlAn format …
mp.sigs <- getSignatures(bsdb, tax.id.type = "metaphlan")
mp.sigs[1:3]
#> $`bsdb:1/1/1_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_UP`
#>  [1] "k__Bacteria|p__Bacillota|c__Bacilli"                                                                                        
#>  [2] "k__Bacteria|p__Pseudomonadota|c__Gammaproteobacteria"                                                                       
#>  [3] "k__Bacteria|p__Actinomycetota|c__Actinomycetes|o__Actinomycetales|f__Actinomycetaceae|g__Actinomyces"                       
#>  [4] "k__Bacteria|p__Actinomycetota|c__Actinomycetes|o__Mycobacteriales|f__Corynebacteriaceae|g__Corynebacterium"                 
#>  [5] "k__Bacteria|p__Bacillota|c__Bacilli|o__Lactobacillales|f__Streptococcaceae|g__Streptococcus"                                
#>  [6] "k__Bacteria|p__Bacillota|c__Tissierellia|o__Tissierellales|f__Peptoniphilaceae|g__Peptoniphilus"                            
#>  [7] "k__Bacteria|p__Bacillota|c__Clostridia|o__Eubacteriales|f__Lachnospiraceae|g__Dorea"                                        
#>  [8] "k__Bacteria|p__Bacillota|c__Negativicutes|o__Acidaminococcales|f__Acidaminococcaceae|g__Phascolarctobacterium"              
#>  [9] "k__Bacteria|p__Pseudomonadota|c__Betaproteobacteria|o__Burkholderiales|f__Sutterellaceae|g__Sutterella"                     
#> [10] "k__Bacteria|p__Actinomycetota|c__Actinomycetes|o__Actinomycetales"                                                          
#> [11] "k__Bacteria|p__Actinomycetota|c__Actinomycetes|o__Actinomycetales|f__Actinomycetaceae"                                      
#> [12] "k__Bacteria|p__Pseudomonadota|c__Betaproteobacteria|o__Burkholderiales|f__Alcaligenaceae"                                   
#> [13] "k__Bacteria|p__Bacillota|c__Bacilli|o__Lactobacillales"                                                                     
#> [14] "k__Bacteria|p__Bacillota|c__Bacilli|o__Lactobacillales|f__Streptococcaceae"                                                 
#> [15] "k__Bacteria|p__Bacillota|c__Negativicutes|o__Veillonellales|f__Veillonellaceae"                                             
#> [16] "k__Bacteria|p__Pseudomonadota|c__Gammaproteobacteria|o__Enterobacterales"                                                   
#> [17] "k__Bacteria|p__Actinomycetota|c__Actinomycetes|o__Mycobacteriales|f__Corynebacteriaceae"                                    
#> [18] "k__Bacteria|p__Bacillota|c__Bacilli|o__Lactobacillales|f__Lactobacillaceae|g__Lacticaseibacillus|s__Lacticaseibacillus zeae"
#> [19] "k__Bacteria|p__Bacillota|c__Bacilli|o__Bacillales|f__Bacillaceae|g__Bacillus"                                               
#> [20] "k__Bacteria|p__Bacillota|c__Bacilli|o__Bacillales|f__Bacillaceae"                                                           
#> 
#> $`bsdb:1/1/2_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_DOWN`
#> [1] "k__Bacteria|p__Bacillota|c__Erysipelotrichia|o__Erysipelotrichales|f__Coprobacillaceae|g__Coprobacillus"
#> [2] "k__Bacteria|p__Cyanobacteriota"                                                                         
#> 
#> $`bsdb:1/2/1_Hyperplastic-Polyp:hyperplastic-polyp-cases_vs_controls_UP`
#> [1] "k__Bacteria|p__Bacillota|c__Clostridia|o__Eubacteriales|f__Lachnospiraceae|g__Anaerostipes"                                 
#> [2] "k__Bacteria|p__Bacillota|c__Bacilli|o__Lactobacillales|f__Lactobacillaceae|g__Lacticaseibacillus|s__Lacticaseibacillus zeae"… or using the taxonomic name only:
tn.sigs <- getSignatures(bsdb, tax.id.type = "taxname")
tn.sigs[1:3]
#> $`bsdb:1/1/1_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_UP`
#>  [1] "Bacilli"                 "Gammaproteobacteria"    
#>  [3] "Actinomyces"             "Corynebacterium"        
#>  [5] "Streptococcus"           "Peptoniphilus"          
#>  [7] "Dorea"                   "Phascolarctobacterium"  
#>  [9] "Sutterella"              "Actinomycetales"        
#> [11] "Actinomycetaceae"        "Alcaligenaceae"         
#> [13] "Lactobacillales"         "Streptococcaceae"       
#> [15] "Veillonellaceae"         "Enterobacterales"       
#> [17] "Corynebacteriaceae"      "Lacticaseibacillus zeae"
#> [19] "Bacillus"                "Bacillaceae"            
#> 
#> $`bsdb:1/1/2_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_DOWN`
#> [1] "Coprobacillus"   "Cyanobacteriota"
#> 
#> $`bsdb:1/2/1_Hyperplastic-Polyp:hyperplastic-polyp-cases_vs_controls_UP`
#> [1] "Anaerostipes"            "Lacticaseibacillus zeae"As metagenomic profiling with 16S RNA sequencing or whole-metagenome shotgun sequencing is typically conducted on a certain taxonomic level, it is also possible to obtain signatures restricted to eg. the genus level …
gn.sigs <- getSignatures(bsdb, 
                         tax.id.type = "taxname",
                         tax.level = "genus")
gn.sigs[1:3]
#> $`bsdb:1/1/1_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_UP`
#> [1] "Actinomyces"           "Corynebacterium"       "Streptococcus"        
#> [4] "Peptoniphilus"         "Dorea"                 "Phascolarctobacterium"
#> [7] "Sutterella"            "Bacillus"             
#> 
#> $`bsdb:1/1/2_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_DOWN`
#> [1] "Coprobacillus"
#> 
#> $`bsdb:1/2/1_Hyperplastic-Polyp:hyperplastic-polyp-cases_vs_controls_UP`
#> [1] "Anaerostipes"… or the species level:
gn.sigs <- getSignatures(bsdb, 
                         tax.id.type = "taxname",
                         tax.level = "species")
gn.sigs[1:3]
#> $`bsdb:1/1/1_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_UP`
#> [1] "Lacticaseibacillus zeae"
#> 
#> $`bsdb:1/2/1_Hyperplastic-Polyp:hyperplastic-polyp-cases_vs_controls_UP`
#> [1] "Lacticaseibacillus zeae"
#> 
#> $`bsdb:1/6/1_Colorectal-adenoma:Non-advanced-conventional-adenoma-cases_vs_controls_UP`
#> [1] "Lacticaseibacillus zeae"Note that restricting signatures to microbes given at the genus level, will per default exclude microbes given at a more specific taxonomic rank such as species or strain.
For certain applications, it might be desirable to not exclude microbes given
at a more specific taxonomic rank, but rather extract the more general
tax.level for microbes given at a more specific taxonomic level.
This can be achieved by setting the argument exact.tax.level to FALSE,
which will here extract genus level taxon names, for taxa given at the species
or strain level.
gn.sigs <- getSignatures(bsdb, 
                         tax.id.type = "taxname",
                         tax.level = "genus",
                         exact.tax.level = FALSE)
gn.sigs[1:3]
#> $`bsdb:1/1/1_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_UP`
#> [1] "Actinomyces"           "Corynebacterium"       "Streptococcus"        
#> [4] "Peptoniphilus"         "Dorea"                 "Phascolarctobacterium"
#> [7] "Sutterella"            "Lacticaseibacillus"    "Bacillus"             
#> 
#> $`bsdb:1/1/2_Colorectal-adenoma:conventional-adenoma-cases_vs_controls_DOWN`
#> [1] "Coprobacillus"
#> 
#> $`bsdb:1/2/1_Hyperplastic-Polyp:hyperplastic-polyp-cases_vs_controls_UP`
#> [1] "Anaerostipes"       "Lacticaseibacillus"Once signatures have been extracted using a taxonomic identifier type of
choice, the function writeGMT allows to write the signatures to plain text
files in GMT format.
writeGMT(sigs, gmt.file = "bugsigdb_signatures.gmt")This is the standard file format for gene sets used by MSigDB and GeneSigDB and is compatible with most enrichment analysis software.
Leveraging BugSigDB’s semantic MediaWiki web interface, we can also programmatically access annotations for individual microbes and microbe signatures.
The browseSignature function can be used to display BugSigDB signature pages
in an interactive session. For programmatic access in a non-interactive
setting, the URL of the signature page is returned.
browseSignature(names(sigs)[1])
#> [1] "https://bugsigdb.org/Study_1/Experiment_1/Signature_1"Analogously, the browseTaxon function displays BugSigDB taxon pages in an
interactive session, or the URL of the corresponding taxon page otherwise.
browseTaxon(sigs[[1]][1])
#> [1] "https://bugsigdb.org/Special:RunQuery/Taxon?Taxon%5BNCBI%5D=91061&_run=1"The Semantic MediaWiki curation interface at bugsigdb.org enforces metadata annotation of signatures to follow established ontologies such as the Experimental Factor Ontology (EFO) for condition, and the Uber-Anatomy Ontology (UBERON) for body site.
The getOntology function can be used to import both ontologies into R.
The result is an object of class ontology_index from the
ontologyIndex
package.
efo <- getOntology("efo")
#> Loading required namespace: ontologyIndex
#> Using cached version from 2024-04-16 20:51:11
efo
#> Ontology with 51465 terms
#> 
#> format-version: 1.2
#> data-version: http://www.ebi.ac.uk/efo/releases/v3.70.0/efo.owl
#> ontology: http://www.ebi.ac.uk/efo/efo.owl
#> 
#> Properties:
#>  id: character
#>  name: character
#>  parents: list
#>  children: list
#>  ancestors: list
#>  obsolete: logical
#>  equivalent_to: list
#> Roots:
#>  EFO:0000001 - experimental factor
#>  EFO:0000824 - relationship
#>  RO:0000053 - bearer_of
#>  RO:0000057 - has_participant
#>  RO:0000056 - participates_in
#>  RO:0002323 - mereotopologically related to
#>  RO:0002502 - depends on
#>  located_in - located_in
#>  location_of - location_of
#>  CHEBI:16422 - NA
#>  ... 59 moreuberon <- getOntology("uberon")
#> Using cached version from 2024-04-16 20:52:16
uberon
#> Ontology with 14107 terms
#> 
#> format-version: 1.2
#> data-version: releases/2020-09-16
#> default-namespace: uberon
#> ontology: uberon
#> 
#> Properties:
#>  id: character
#>  name: character
#>  parents: list
#>  children: list
#>  ancestors: list
#>  obsolete: logical
#> Roots:
#>  part_of - part of
#>  has_part - has part
#>  functionally_related_to - functionally related to
#>  UBERON:0001062 - anatomical entity
#>  adjacent_to - adjacent_to
#>  UBERON:0000000 - processual entity
#>  anterior_to - anterior_to
#>  posterior_to - posterior_to
#>  attaches_to_part_of - attaches_to_part_of
#>  bearer_of - bearer of
#>  ... 127 moreAs demonstrated above, subsets of BugSigDB signatures can be obtained for signatures
associated with certain experimental factors or specific body sites of interest.
Higher-level queries can be performed with the subsetByOntology function, which
implements subsetting by more general ontology terms. This facilitates grouping
of signatures that semantically belong together.
More specifically, subsetting BugSigDB signatures by an EFO term then involves
subsetting the Condition column to the term itself and all descendants of that
term in the EFO ontology and that are present in the Condition column. Here,
we demonstrate the usage by subsetting to signatures associated with cancer.
sdf <- subsetByOntology(bsdb,
                        column = "Condition",
                        term = "cancer",
                        ontology = efo)
dim(sdf)
#> [1] 311  50
table(sdf[,"Condition"])
#> 
#>                                       Acute myeloid leukemia 
#>                                                           13 
#>                                                Breast cancer 
#>                                                           16 
#>                                             Breast carcinoma 
#>                                                            4 
#>                                              Cervical cancer 
#>                                                           18 
#> Cervical glandular intraepithelial neoplasia,Cervical cancer 
#>                                                            2 
#>                                    Colorectal adenocarcinoma 
#>                                                            9 
#>                                         Colorectal carcinoma 
#>                                                            7 
#>                                      Digestive system cancer 
#>                                                            2 
#>                                           Endometrial cancer 
#>                                                            4 
#>                                            Esophageal cancer 
#>                                                           10 
#>                           Esophageal squamous cell carcinoma 
#>                                                            4 
#>                                       Gastric adenocarcinoma 
#>                                                            6 
#>                                               Gastric cancer 
#>                                                           73 
#>                                            Gastric carcinoma 
#>                                                            2 
#>                                     Genital neoplasm, female 
#>                                                            2 
#>                               HER2 Positive Breast Carcinoma 
#>                                                            2 
#>                                      Head and neck carcinoma 
#>                                                            7 
#>                        Head and neck squamous cell carcinoma 
#>                                                           12 
#>                                     Hepatocellular carcinoma 
#>                                                            9 
#>              Human papilloma virus infection,Cervical cancer 
#>                                                            2 
#>                                                  Lung cancer 
#>                                                           23 
#>                                             Multiple myeloma 
#>                                                           11 
#>                       Nasopharyngeal squamous cell carcinoma 
#>                                                            4 
#>           Non-small cell lung carcinoma,Renal cell carcinoma 
#>                                                            5 
#>                                 Oral squamous cell carcinoma 
#>                                                           20 
#>                                               Ovarian cancer 
#>                                                            4 
#>                                         Pancreatic carcinoma 
#>                                                           14 
#>                                              Prostate cancer 
#>                                                            4 
#>                                      Squamous cell carcinoma 
#>                                                           20 
#>                                            Thyroid carcinoma 
#>                                                            2And analogously, subsetting by an UBERON term involves subsetting the
Body site column to the term itself and all descendants of that term in the
UBERON ontology and that are present in the Body site column. For example,
we can use subsetByOntology to subset to signatures for which microbiome
samples have been obtained from parts of the digestive system.
sdf <- subsetByOntology(bsdb,
                        column = "Body site",
                        term = "digestive system",
                        ontology = uberon)
dim(sdf)
#> [1] 625  50
table(sdf[,"Body site"])
#> 
#>                                                Bronchus,Mouth 
#>                                                             2 
#>                                                 Buccal mucosa 
#>                                                            12 
#>                                       Buccal mucosa,Lower lip 
#>                                                             8 
#>                                                        Caecum 
#>                                                            12 
#>                                             Cavity of pharynx 
#>                                                             2 
#>     Cecum mucosa,Colonic mucosa,Mucosa of rectum,Ileal mucosa 
#>                                                             5 
#>                                                         Colon 
#>                                                            24 
#>                                                Colonic mucosa 
#>                                                             8 
#>                                             Colorectal mucosa 
#>                                                            16 
#>                                                    Colorectum 
#>                                                             1 
#>                                                 Dental plaque 
#>                                                            13 
#>                     Dental plaque,Internal cheek pouch,Saliva 
#>                                                             2 
#>                                               Duodenal mucosa 
#>                                                             1 
#>                                                      Duodenum 
#>                                                             7 
#>                                            Duodenum,Bile duct 
#>                                                             1 
#>                                          Feces,Colonic mucosa 
#>                                                             1 
#>                              Feces,Mucosa of descending colon 
#>                                                             5 
#>                               Feces,Mucosa of small intestine 
#>                                                             4 
#>                    Feces,Stomach,Caecum,Small intestine,Colon 
#>                                                             2 
#>                                                   Gastric pit 
#>                                                             4 
#>                                                       Gingiva 
#>                                                             5 
#>                                                   Hypopharynx 
#>                                                             1 
#>                                                         Ileum 
#>                                                             2 
#>                                                  Ileum,Rectum 
#>                                                             2 
#>                                            Ileum,Rectum,Feces 
#>                                                             2 
#>                                          Internal cheek pouch 
#>                                                             8 
#>                                             Intestinal mucosa 
#>                                                            10 
#>                                                     Intestine 
#>                                                            44 
#>                                                        Midgut 
#>                                                             2 
#>                                                         Mouth 
#>                                                            72 
#>                                                  Mouth mucosa 
#>                                                             4 
#>                 Mouth,Skin of cheek,Tongue,Gingiva,Oropharynx 
#>                                                             2 
#>                                     Mucosa of ascending colon 
#>                                                             2 
#> Mucosa of oral region,Vagina,Skin of forehead,Skin of forearm 
#>                                                             1 
#>                                          Mucosa of oropharynx 
#>                                                             4 
#>                                              Mucosa of rectum 
#>                                                             2 
#>                                     Mucosa of small intestine 
#>                                                             2 
#>                                             Mucosa of stomach 
#>                                                             3 
#>                                          Nasopharyngeal gland 
#>                                                             2 
#>                                                   Nasopharynx 
#>                                                            59 
#>                                              Nasopharynx,Lung 
#>                                                             3 
#>                                        Nasopharynx,Oropharynx 
#>                                                             8 
#>                                                    Nose,Mouth 
#>                                                             2 
#>                                                   Oral cavity 
#>                                                            32 
#>                                                  Oral opening 
#>                                                             6 
#>                                                    Oropharynx 
#>                                                            32 
#>    Oropharynx,Lower respiratory tract,Upper respiratory tract 
#>                                                             7 
#>                                                       Pharynx 
#>                                                             4 
#>                                                        Rectum 
#>                                                            24 
#>                                                         Rumen 
#>                                                             4 
#>                                               Small intestine 
#>                                                            16 
#>                                                  Sputum,Mouth 
#>                                                             2 
#>                                                       Stomach 
#>                                                            40 
#>                                     Subgingival dental plaque 
#>                                                            51 
#>                                    Superior surface of tongue 
#>                                                             2 
#>                                   Supragingival dental plaque 
#>                                                             2 
#>                                                        Tongue 
#>                                                            29 
#>                                       Wall of small intestine 
#>                                                             2sessionInfo()
#> R version 4.4.1 (2024-06-14)
#> Platform: x86_64-pc-linux-gnu
#> Running under: Ubuntu 22.04.4 LTS
#> 
#> Matrix products: default
#> BLAS:   /home/biocbuild/bbs-3.19-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] stats     graphics  grDevices utils     datasets  methods   base     
#> 
#> other attached packages:
#> [1] bugsigdbr_1.10.1 BiocStyle_2.32.1
#> 
#> loaded via a namespace (and not attached):
#>  [1] bit_4.5.0            jsonlite_1.8.9       dplyr_1.1.4         
#>  [4] compiler_4.4.1       BiocManager_1.30.25  filelock_1.0.3      
#>  [7] tidyselect_1.2.1     blob_1.2.4           jquerylib_0.1.4     
#> [10] yaml_2.3.10          fastmap_1.2.0        R6_2.5.1            
#> [13] generics_0.1.3       curl_5.2.3           knitr_1.48          
#> [16] ontologyIndex_2.12   tibble_3.2.1         bookdown_0.40       
#> [19] DBI_1.2.3            bslib_0.8.0          pillar_1.9.0        
#> [22] rlang_1.1.4          utf8_1.2.4           cachem_1.1.0        
#> [25] xfun_0.47            sass_0.4.9           bit64_4.5.2         
#> [28] RSQLite_2.3.7        memoise_2.0.1        cli_3.6.3           
#> [31] withr_3.0.1          magrittr_2.0.3       digest_0.6.37       
#> [34] dbplyr_2.5.0         lifecycle_1.0.4      BiocFileCache_2.12.0
#> [37] vctrs_0.6.5          evaluate_1.0.0       glue_1.7.0          
#> [40] fansi_1.0.6          purrr_1.0.2          rmarkdown_2.28      
#> [43] httr_1.4.7           tools_4.4.1          pkgconfig_2.0.3     
#> [46] htmltools_0.5.8.1