The Impact of Genomic Variation on Function (IGVF) Consortium,
aims to understand how genomic variation affects genome function, which in turn impacts phenotype. The NHGRI is funding this collaborative program that brings together teams of investigators who will use state-of-the-art experimental and computational approaches to model, predict, characterize and map genome function, how genome function shapes phenotype, and how these processes are affected by genomic variation. These joint efforts will produce a catalog of the impact of genomic variants on genome function and phenotypes.
The IGVF Catalog described in the last sentence is available through a number of interfaces, including a web interface as well as two programmatic interfaces. In addition, there is a Data Portal, where raw and processed data can be downloaded, with its own web interface and client library for R. This package, rigvf, focuses on the Catalog and not the Data Portal.
The IGVF Catalog is a form of knowledge graph, where the nodes are biological entities such as variants, genes, pathways, etc. and edges are relationships between such nodes, e.g. empirically measured effects of variants on cis-regulatory elements (CREs) or on transcripts and proteins. These edges may have metadata including information about cell type context and information about how the association was measured, e.g. which experiment or predictive model.
This package provides access to some of the IGVF Catalog from within R/Bioconductor. Currently, limited functionality is implemented, with priority towards applications and integration with Bioconductor functionality. However, the source code and internal functions can also be used to build one-off querying functions.
For IGVF Catalog data license, see the IGVF policy page.
The IGVF Catalog offers two programmatic interfaces, the Catalog API and an ArangoDb interface, described further below. The Catalog API is preferred, with optimized queries of relevant information. Queries are simple REST requests implemented using the httr2 package. Here we query variants associated with “GCK”; one could also use, e.g., Ensembl identifiers.
library(rigvf)
gene_variants(gene_name = "GCK")
#> # A tibble: 25 × 9
#>    sequence_variant        gene  label log10pvalue effect_size source source_url
#>    <chr>                   <chr> <chr>       <dbl>       <dbl> <chr>  <chr>     
#>  1 variants/8c6a683829bcb… gene… eQTL         4.89       0.274 GTEx   https://s…
#>  2 variants/cf796b5a16212… gene… eQTL         5.76       0.221 GTEx   https://s…
#>  3 variants/9a36af4633321… gene… eQTL         6.17      -0.266 GTEx   https://s…
#>  4 variants/2fefe07a0750b… gene… eQTL         3.69       0.158 GTEx   https://s…
#>  5 variants/ab6df1152a643… gene… eQTL        16.9       -0.353 GTEx   https://s…
#>  6 variants/92833b52621e5… gene… eQTL         4.86      -0.170 GTEx   https://s…
#>  7 variants/bceca4e6ac3cd… gene… eQTL         4.63      -0.340 GTEx   https://s…
#>  8 variants/0a8ba63e5451a… gene… eQTL         4.94       0.215 GTEx   https://s…
#>  9 variants/80f639e0da643… gene… eQTL         6.59      -0.330 GTEx   https://s…
#> 10 variants/7f4ca6f1cfd70… gene… eQTL         4.10      -0.165 GTEx   https://s…
#> # ℹ 15 more rows
#> # ℹ 2 more variables: biological_context <chr>, chr <chr>Note that we only receive a limited number of responses. We can change both the page of responses we receive and the limit per page:
gene_variants(gene_name = "GCK", page=1L)
#> # A tibble: 25 × 9
#>    sequence_variant        gene  label log10pvalue effect_size source source_url
#>    <chr>                   <chr> <chr>       <dbl>       <dbl> <chr>  <chr>     
#>  1 variants/89906a3ef6b64… gene… eQTL         6.28      -0.185 GTEx   https://s…
#>  2 variants/8f43caa04db1a… gene… eQTL         4.05      -0.208 GTEx   https://s…
#>  3 variants/92833b52621e5… gene… eQTL         5.90      -0.279 GTEx   https://s…
#>  4 variants/0dbbe5c1400bd… gene… eQTL         4.45       0.185 GTEx   https://s…
#>  5 variants/2d121dd1f87bc… gene… eQTL         5.46       0.209 GTEx   https://s…
#>  6 variants/80f639e0da643… gene… eQTL         6.45      -0.306 GTEx   https://s…
#>  7 variants/80087ed4fa460… gene… eQTL        13.1       -0.332 GTEx   https://s…
#>  8 variants/5fdfcba3af0b3… gene… eQTL        14.1        0.364 GTEx   https://s…
#>  9 variants/8297f73079320… gene… eQTL        11.1       -0.321 GTEx   https://s…
#> 10 variants/629c8018822de… gene… eQTL         8.50      -0.217 GTEx   https://s…
#> # ℹ 15 more rows
#> # ℹ 2 more variables: biological_context <chr>, chr <chr>
gene_variants(gene_name = "GCK", limit=50L)
#> # A tibble: 50 × 9
#>    sequence_variant        gene  label log10pvalue effect_size source source_url
#>    <chr>                   <chr> <chr>       <dbl>       <dbl> <chr>  <chr>     
#>  1 variants/8c6a683829bcb… gene… eQTL         4.89       0.274 GTEx   https://s…
#>  2 variants/cf796b5a16212… gene… eQTL         5.76       0.221 GTEx   https://s…
#>  3 variants/9a36af4633321… gene… eQTL         6.17      -0.266 GTEx   https://s…
#>  4 variants/2fefe07a0750b… gene… eQTL         3.69       0.158 GTEx   https://s…
#>  5 variants/ab6df1152a643… gene… eQTL        16.9       -0.353 GTEx   https://s…
#>  6 variants/92833b52621e5… gene… eQTL         4.86      -0.170 GTEx   https://s…
#>  7 variants/bceca4e6ac3cd… gene… eQTL         4.63      -0.340 GTEx   https://s…
#>  8 variants/0a8ba63e5451a… gene… eQTL         4.94       0.215 GTEx   https://s…
#>  9 variants/80f639e0da643… gene… eQTL         6.59      -0.330 GTEx   https://s…
#> 10 variants/7f4ca6f1cfd70… gene… eQTL         4.10      -0.165 GTEx   https://s…
#> # ℹ 40 more rows
#> # ℹ 2 more variables: biological_context <chr>, chr <chr>We can also pass thresholds on the negative log10 p-value or the effect size, using the following letter combinations, gt (>), gte (>=), lt (<), lte (<=), followed by a : and a value. See examples below:
gene_variants(gene_name = "GCK", log10pvalue="gt:5.0")
#> # A tibble: 25 × 9
#>    sequence_variant        gene  label log10pvalue effect_size source source_url
#>    <chr>                   <chr> <chr>       <dbl>       <dbl> <chr>  <chr>     
#>  1 variants/cf796b5a16212… gene… eQTL         5.76       0.221 GTEx   https://s…
#>  2 variants/9a36af4633321… gene… eQTL         6.17      -0.266 GTEx   https://s…
#>  3 variants/ab6df1152a643… gene… eQTL        16.9       -0.353 GTEx   https://s…
#>  4 variants/80f639e0da643… gene… eQTL         6.59      -0.330 GTEx   https://s…
#>  5 variants/8fda8a39c0e19… gene… eQTL         5.01      -0.462 GTEx   https://s…
#>  6 variants/9f9220f88fd20… gene… eQTL         9.76      -0.317 GTEx   https://s…
#>  7 variants/1542d8dc4347e… gene… eQTL         6.88      -0.197 GTEx   https://s…
#>  8 variants/6267c5fed3521… gene… eQTL         6.26      -0.240 GTEx   https://s…
#>  9 variants/24e837efe47bc… gene… eQTL         6.07       0.213 GTEx   https://s…
#> 10 variants/31b41a47c007f… gene… eQTL        15.4       -0.361 GTEx   https://s…
#> # ℹ 15 more rows
#> # ℹ 2 more variables: biological_context <chr>, chr <chr>
gene_variants(gene_name = "GCK", effect_size="gt:0.5")
#> # A tibble: 13 × 9
#>    sequence_variant        gene  label log10pvalue effect_size source source_url
#>    <chr>                   <chr> <chr>       <dbl>       <dbl> <chr>  <chr>     
#>  1 variants/2e1a52f2551d6… gene… eQTL         5.08       0.502 GTEx   https://s…
#>  2 variants/513df90562f2e… gene… eQTL         3.68       0.628 GTEx   https://s…
#>  3 variants/ba959d0d02884… gene… eQTL         3.90       0.515 GTEx   https://s…
#>  4 variants/965035c14bc1a… gene… eQTL         3.65       0.548 GTEx   https://s…
#>  5 variants/e0d388dd97ea5… gene… eQTL         5.74       0.541 GTEx   https://s…
#>  6 variants/a2362bdd461e7… gene… eQTL         4.63       0.770 GTEx   https://s…
#>  7 variants/a4919ef974d2c… gene… eQTL         4.17       0.732 GTEx   https://s…
#>  8 variants/c117f48f3e28e… gene… eQTL         3.98       0.589 GTEx   https://s…
#>  9 variants/f72c43e10b242… gene… eQTL         4.03       0.581 GTEx   https://s…
#> 10 variants/ba959d0d02884… gene… eQTL         4.09       0.502 GTEx   https://s…
#> 11 variants/7fc7d0a82445b… gene… eQTL         5.36       0.552 GTEx   https://s…
#> 12 variants/74b4b8f7b37f5… gene… eQTL         4.13       0.604 GTEx   https://s…
#> 13 variants/829ce03f1d460… gene… eQTL         4.50       0.631 GTEx   https://s…
#> # ℹ 2 more variables: biological_context <chr>, chr <chr>The help page ?catalog_queries outlines other available user-facing functions.
Note that nested columns in the response can be widen-ed using tidyr. For example, when querying genomic elements that are associated with a gene, we get back nested output:
res <- gene_elements(gene_id = "ENSG00000187961", verbose = TRUE)
res
#> # A tibble: 25 × 2
#>    gene             elements        
#>    <list>           <list>          
#>  1 <named list [5]> <named list [9]>
#>  2 <named list [5]> <named list [9]>
#>  3 <named list [5]> <named list [9]>
#>  4 <named list [5]> <named list [9]>
#>  5 <named list [5]> <named list [9]>
#>  6 <named list [5]> <named list [9]>
#>  7 <named list [5]> <named list [9]>
#>  8 <named list [5]> <named list [9]>
#>  9 <named list [5]> <named list [9]>
#> 10 <named list [5]> <named list [9]>
#> # ℹ 15 more rows
res |>
    dplyr::select(elements) |>
    tidyr::unnest_wider(elements)
#> # A tibble: 25 × 9
#>    id      cell_type  score model dataset element_type element_chr element_start
#>    <chr>   <chr>      <dbl> <chr> <chr>   <chr>        <chr>               <int>
#>  1 genomi… hela      0.0244 ENCO… https:… accessible … chr1              1000976
#>  2 genomi… cd4-posi… 0.0168 ENCO… https:… accessible … chr1              1000976
#>  3 genomi… cd8-posi… 0.0271 ENCO… https:… accessible … chr1              1000976
#>  4 genomi… esophagu… 0.0180 ENCO… https:… accessible … chr1              1000976
#>  5 genomi… astrocyte 0.0188 ENCO… https:… accessible … chr1              1000976
#>  6 genomi… endometr… 0.0156 ENCO… https:… accessible … chr1              1000976
#>  7 genomi… ependyma… 0.0160 ENCO… https:… accessible … chr1              1000976
#>  8 genomi… osteobla… 0.0109 ENCO… https:… accessible … chr1              1000976
#>  9 genomi… macropha… 0.0137 ENCO… https:… accessible … chr1              1000976
#> 10 genomi… astrocyte 0.0172 ENCO… https:… accessible … chr1              1000976
#> # ℹ 15 more rows
#> # ℹ 1 more variable: element_end <int>The functions elements() and element_genes() take GRanges input ranges, and elements() provides back the response as GRanges. Note that IGVF uses hg38 and USCS-style chromosome names, e.g., chr1.
The ArangoDB API provides flexibility but requires greater understanding of Arango Query Language and the database schema. Documentation is available in the database under the ‘Support’ menu item ‘REST API’ tab using username ‘guest’ and password ‘guestigvfcatalog’.
The following directly queries the database for variants of an Ensembl gene id.
db_gene_variants("ENSG00000106633", threshold = 0.85)
#> # A tibble: 1,000 × 14
#>    `_key`           `_id` `_from` `_to` `_rev` biological_context chr    p_value
#>    <chr>            <chr> <chr>   <chr> <chr>  <chr>              <chr>    <dbl>
#>  1 a6cbc153279e78b… vari… varian… gene… _i42_… esophagus muscula… chr7  5.82e-12
#>  2 fe37460fd352499… vari… varian… gene… _i42_… esophagus muscula… chr7  3.55e- 5
#>  3 541cb07e388227c… vari… varian… gene… _i42_… esophagus muscula… chr7  9.43e-12
#>  4 f926f23ed97a1ae… vari… varian… gene… _i42_… esophagus muscula… chr7  9.43e-12
#>  5 d4ed70a043d0f18… vari… varian… gene… _i42_… esophagus muscula… chr7  1.41e- 4
#>  6 52abc832332dc09… vari… varian… gene… _i42_… esophagus muscula… chr7  1.41e- 4
#>  7 4600cd627888076… vari… varian… gene… _i42_… esophagus muscula… chr7  4.17e-12
#>  8 68592e5fefff525… vari… varian… gene… _i42_… esophagus muscula… chr7  1.41e- 4
#>  9 0642a7286da19b2… vari… varian… gene… _i42_… esophagus muscula… chr7  3.58e- 5
#> 10 b2b44a8a0e56c9b… vari… varian… gene… _i42_… esophagus muscula… chr7  2.94e- 5
#> # ℹ 990 more rows
#> # ℹ 6 more variables: log10pvalue <dbl>, effect_size <dbl>, pval_beta <dbl>,
#> #   label <chr>, source <chr>, source_url <chr>The AQL is
aql <- system.file(package = "rigvf", "aql", "gene_variants.aql")
readLines(aql) |> noquote()
#> [1] FOR l IN variants_genes                
#> [2]     FILTER l._to == @geneid            
#> [3]     FILTER l.`log10pvalue` > @threshold
#> [4]     RETURN lThe help page ?db_queries outlines other available user-facing functions. See ?arango for more developer-oriented information.
We can query genomic elements using elements() and then compute overlaps with the plyranges package as below. See the plyranges package documentation for more examples.
library(plyranges)
rng <- data.frame(seqnames="chr1", start=10e6+1, end=10.1e6) |>
  as_granges()
e <- elements(rng, limit=200L) |>
  plyranges::filter(source != "ENCODE_EpiRaction")
e
#> GRanges object with 106 ranges and 5 metadata columns:
#>         seqnames            ranges strand |         name      source_annotation
#>            <Rle>         <IRanges>  <Rle> |  <character>            <character>
#>     [1]     chr1 10001018-10001351      * | EH38E1317660 dELS: distal Enhance..
#>     [2]     chr1 10001823-10002161      * | EH38E3954141         TF: TF binding
#>     [3]     chr1 10002812-10003022      * | EH38E3954142 dELS: distal Enhance..
#>     [4]     chr1 10006462-10006688      * | EH38E3954143 CA: chromatin access..
#>     [5]     chr1 10007231-10007550      * | EH38E2785201 dELS: distal Enhance..
#>     ...      ...               ...    ... .          ...                    ...
#>   [102]     chr1 10090145-10090362      * | EH38E1317734 dELS: distal Enhance..
#>   [103]     chr1 10095440-10095595      * | EH38E1317735 dELS: distal Enhance..
#>   [104]     chr1 10096338-10096538      * | EH38E2785256 CA-CTCF: chromatin a..
#>   [105]     chr1 10098488-10098819      * | EH38E1317737 dELS: distal Enhance..
#>   [106]     chr1 10099598-10099944      * | EH38E3954159 CA: chromatin access..
#>                           type                source             source_url
#>                    <character>           <character>            <character>
#>     [1] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>     [2] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>     [3] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>     [4] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>     [5] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>     ...                    ...                   ...                    ...
#>   [102] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>   [103] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>   [104] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>   [105] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>   [106] candidate cis regula.. ENCODE_SCREEN (ccREs) https://www.encodepr..
#>   -------
#>   seqinfo: 1 sequence from hg38 genome; no seqlengthstiles <- tile_ranges(rng, width=10e3) %>%
  plyranges::select(-partition) %>%
  plyranges::mutate(id = letters[seq_along(.)])
# count overlaps of central basepair of elements in tiles
e |>
  plyranges::anchor_center() |>
  plyranges::mutate(width = 1) |>
  plyranges::join_overlap_left(tiles) |>
  tibble::as_tibble() |>
  dplyr::count(id)
#> # A tibble: 10 × 2
#>    id        n
#>    <chr> <int>
#>  1 a         6
#>  2 b        13
#>  3 c        10
#>  4 d        15
#>  5 e        11
#>  6 f        15
#>  7 g        12
#>  8 h        12
#>  9 i         7
#> 10 j         5Below we show a simple example of plotting variants and elements in a gene context, using the plotgardener package.
First selecting some variants around the gene GCK (reminder that we only obtain the first limit number of variants, see ?catalog_queries for more details).
# up to 200 variants:
v <- gene_variants(gene_name = "GCK", limit=200L, verbose=TRUE) |>
  dplyr::select(-c(gene, chr, source, source_url)) |>
  tidyr::unnest_wider(sequence_variant) |>
  dplyr::rename(seqnames = chr) |>
  dplyr::mutate(start = pos + 1, end = pos + 1) |>
  as_granges()We then load plotgardener and define some default parameters.
library(plotgardener)
par <- pgParams(
  chrom = "chr7",
  chromstart = 44.1e6,
  chromend = 44.25e6,
  assembly = "hg38",
  just = c("left", "bottom")
)Renaming some columns:
To match with the correct gene annotation, we could explicitly define the transcript database using plotgardener::assembly(), where we would provide a database built by running GenomicFeatures::makeTxDbFromGFF() on a GENCODE GTF file. Here we use one of the standard hg38 TxDb with UCSC-style chromosome names.
library(TxDb.Hsapiens.UCSC.hg38.knownGene)
#> Loading required package: GenomicFeatures
#> Loading required package: AnnotationDbi
#> Loading required package: Biobase
#> Welcome to Bioconductor
#> 
#>     Vignettes contain introductory material; view with
#>     'browseVignettes()'. To cite Bioconductor, see
#>     'citation("Biobase")', and for packages 'citation("pkgname")'.
#> 
#> Attaching package: 'AnnotationDbi'
#> The following object is masked from 'package:plyranges':
#> 
#>     select
library(org.Hs.eg.db)
#> Below we build the page and populate it with annotation from the TxDb used by plotgardener and from IGVF Catalog.
pageCreate(width = 5, height = 4, showGuides = FALSE)
plotGenes(
  params = par, x = 0.5, y = 3.5, width = 4, height = 1
)
#> genes[genes1]
plotGenomeLabel(
  params = par,
  x = 0.5, y = 3.5, length = 4,
  just = c("left", "top")
)
#> genomeLabel[genomeLabel1]
mplot <- plotManhattan(
  params = par, x = 0.5, y = 2.5, width = 4, height = 2,
  v_for_plot, trans = "",
  sigVal = -log10(5e-8), sigLine = TRUE, col = "grey", lty = 2
)
#> manhattan[manhattan1]
annoYaxis(
    plot = mplot, at=0:4 * 4, axisLine = TRUE, fontsize = 8
)
#> yaxis[yaxis1]
annoXaxis(
    plot = mplot, axisLine = TRUE, label = FALSE
)
#> xaxis[xaxis1]
plotText(
    params = par,
    label = "-log10(p-value)", x = 0.2, y = 2, rot = 90,
    fontsize = 8, fontface = "bold",
    default.units = "inches"
)#> text[text1]sessionInfo()
#> R version 4.5.0 RC (2025-04-04 r88126)
#> Platform: x86_64-pc-linux-gnu
#> Running under: Ubuntu 24.04.2 LTS
#> 
#> Matrix products: default
#> BLAS:   /home/biocbuild/bbs-3.21-bioc/R/lib/libRblas.so 
#> LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.12.0  LAPACK version 3.12.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] org.Hs.eg.db_3.21.0                     
#>  [2] TxDb.Hsapiens.UCSC.hg38.knownGene_3.21.0
#>  [3] GenomicFeatures_1.60.0                  
#>  [4] AnnotationDbi_1.70.0                    
#>  [5] Biobase_2.68.0                          
#>  [6] plotgardener_1.14.0                     
#>  [7] plyranges_1.28.0                        
#>  [8] GenomicRanges_1.60.0                    
#>  [9] GenomeInfoDb_1.44.0                     
#> [10] IRanges_2.42.0                          
#> [11] S4Vectors_0.46.0                        
#> [12] BiocGenerics_0.54.0                     
#> [13] generics_0.1.4                          
#> [14] rigvf_1.0.2                             
#> 
#> loaded via a namespace (and not attached):
#>  [1] tidyselect_1.2.1            blob_1.2.4                 
#>  [3] dplyr_1.1.4                 farver_2.1.2               
#>  [5] Biostrings_2.76.0           bitops_1.0-9               
#>  [7] fastmap_1.2.0               RCurl_1.98-1.17            
#>  [9] GenomicAlignments_1.44.0    XML_3.99-0.18              
#> [11] digest_0.6.37               lifecycle_1.0.4            
#> [13] KEGGREST_1.48.0             RSQLite_2.3.11             
#> [15] magrittr_2.0.3              compiler_4.5.0             
#> [17] rlang_1.1.6                 sass_0.4.10                
#> [19] tools_4.5.0                 utf8_1.2.5                 
#> [21] yaml_2.3.10                 data.table_1.17.2          
#> [23] rtracklayer_1.68.0          knitr_1.50                 
#> [25] S4Arrays_1.8.0              bit_4.6.0                  
#> [27] curl_6.2.3                  DelayedArray_0.34.1        
#> [29] RColorBrewer_1.1-3          abind_1.4-8                
#> [31] BiocParallel_1.42.0         withr_3.0.2                
#> [33] purrr_1.0.4                 grid_4.5.0                 
#> [35] Rhdf5lib_1.30.0             ggplot2_3.5.2              
#> [37] scales_1.4.0                dichromat_2.0-0.1          
#> [39] SummarizedExperiment_1.38.1 cli_3.6.5                  
#> [41] rmarkdown_2.29              crayon_1.5.3               
#> [43] httr_1.4.7                  rjson_0.2.23               
#> [45] DBI_1.2.3                   cachem_1.1.0               
#> [47] rhdf5_2.52.0                parallel_4.5.0             
#> [49] ggplotify_0.1.2             XVector_0.48.0             
#> [51] restfulr_0.0.15             matrixStats_1.5.0          
#> [53] vctrs_0.6.5                 yulab.utils_0.2.0          
#> [55] Matrix_1.7-3                jsonlite_2.0.0             
#> [57] gridGraphics_0.5-1          bit64_4.6.0-1              
#> [59] strawr_0.0.92               tidyr_1.3.1                
#> [61] jquerylib_0.1.4             glue_1.8.0                 
#> [63] codetools_0.2-20            gtable_0.3.6               
#> [65] BiocIO_1.18.0               UCSC.utils_1.4.0           
#> [67] tibble_3.2.1                pillar_1.10.2              
#> [69] rappdirs_0.3.3              htmltools_0.5.8.1          
#> [71] rhdf5filters_1.20.0         GenomeInfoDbData_1.2.14    
#> [73] R6_2.6.1                    httr2_1.1.2                
#> [75] evaluate_1.0.3              lattice_0.22-7             
#> [77] png_0.1-8                   Rsamtools_2.24.0           
#> [79] memoise_2.0.1               bslib_0.9.0                
#> [81] rjsoncons_1.3.2             Rcpp_1.0.14                
#> [83] SparseArray_1.8.0           whisker_0.4.1              
#> [85] xfun_0.52                   MatrixGenerics_1.20.0      
#> [87] fs_1.6.6                    pkgconfig_2.0.3