1 Introduction

logo

RLHub (“R-Loop Hub”) provides processed data sets for the RLSuite toolchain. It is an ExperimentHub package containing annotations of R-Loop consensus regions, genomic features directly relevant to R-loops, such as R-loop-forming sequences (RLFS), G-or-C skew regions, and other data of relevance to RLSuite.

All data were generated via the protocol in the RLBase-data repository.

2 Installation

RLHub can be installed from Bioconductor via the following command:

if (!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")

BiocManager::install("RLHub")

RLHub may also be installed from GitHub:

remotes::install_github("Bishop-Laboratory/RLHub")

3 Accessing RLHub Data

library(RLHub)

Data can be conveniently accessed through ExperimentHub functions or with the built-in accessors available through RLHub.

A summary of the data can also be found by running the following:

?`RLHub-package`

The full manifest of the available data is found here:

DT::datatable(
    read.csv(system.file("extdata", "metadata.csv", package = "RLHub")),
    options = list(
        scrollX=TRUE,
        pageLength = 5
    )
)

The Tags column list the function names used to access each data set. This method of access is detailed below.

3.1 Built-in functions

In the below example, we show how one can access data using convenient built-in functions.

# Access the R-loop binding proteins (RLBPs) data set
rlbps <- RLHub::rlbps()
DT::datatable(rlbps)

The data access function name is simply the value in Tags corresponding to the entry for that data set in the metadata.csv table. In this example,“rlbps” is the tag corresponding to entry #5: “R-loop-binding proteins discovered from mass-spec studies.” Therefore, the function to access this data is simply RLHub::rlbps().

For examples of all accessors, please run the following:

?`RLHub-package`

3.2 ExperimentHub objects

library(ExperimentHub)

In this example, we show how to access RLHub data using the ExperimentHub object.

eh <- ExperimentHub()
rlhub <- query(eh, "RLHub")
rlhub
## ExperimentHub with 16 records
## # snapshotDate(): 2023-10-24
## # $dataprovider: Multiple
## # $species: Homo sapiens, Mus musculus
## # $rdataclass: tbl, list, SummarizedExperiment, preProcess, caretStack
## # additional mcols(): taxonomyid, genome, description,
## #   coordinate_1_based, maintainer, rdatadateadded, preparerclass, tags,
## #   rdatapath, sourceurl, sourcetype 
## # retrieve records with, e.g., 'object[["EH6793"]]' 
## 
##            title                             
##   EH6793 | Primary Genomic Annotations (hg38)
##   EH6794 | Primary Genomic Annotations (mm10)
##   EH6795 | Full Genomic Annotations (hg38)   
##   EH6796 | Full Genomic Annotations (mm10)   
##   EH6797 | R-loop Binding Proteins           
##   ...      ...                               
##   EH6804 | RLFS-Test Results                 
##   EH6805 | RLRegion Annotations              
##   EH6806 | RLRegion Metadata                 
##   EH6807 | RLRegion Read Counts              
##   EH6808 | RLBase Sample Manifest

If we want to obtain the R-loop-binding proteins, for example, we can do so with corresponding ExperimentHub ID.

rlbps <- rlhub[["EH6797"]]
DT::datatable(rlbps)

Finally, all package resources may be loaded as a list using loadResources().

rlhublst <- loadResources(rlhub, package = "RLHub")
names(rlhublst) <- listResources(rlhub, package = "RLHub")

4 Session info

sessionInfo()
## R Under development (unstable) (2023-10-22 r85388)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 22.04.3 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] ExperimentHub_2.11.0 AnnotationHub_3.11.0 BiocFileCache_2.11.1
## [4] dbplyr_2.4.0         BiocGenerics_0.49.0  RLHub_1.9.0         
## [7] BiocStyle_2.31.0    
## 
## loaded via a namespace (and not attached):
##  [1] KEGGREST_1.43.0               xfun_0.40                    
##  [3] bslib_0.5.1                   htmlwidgets_1.6.2            
##  [5] Biobase_2.63.0                crosstalk_1.2.0              
##  [7] bitops_1.0-7                  vctrs_0.6.4                  
##  [9] tools_4.4.0                   generics_0.1.3               
## [11] stats4_4.4.0                  curl_5.1.0                   
## [13] tibble_3.2.1                  fansi_1.0.5                  
## [15] AnnotationDbi_1.65.0          RSQLite_2.3.2                
## [17] blob_1.2.4                    pkgconfig_2.0.3              
## [19] S4Vectors_0.41.1              GenomeInfoDbData_1.2.11      
## [21] lifecycle_1.0.3               compiler_4.4.0               
## [23] Biostrings_2.71.1             GenomeInfoDb_1.39.0          
## [25] httpuv_1.6.12                 htmltools_0.5.6.1            
## [27] sass_0.4.7                    RCurl_1.98-1.12              
## [29] yaml_2.3.7                    interactiveDisplayBase_1.41.0
## [31] pillar_1.9.0                  later_1.3.1                  
## [33] crayon_1.5.2                  jquerylib_0.1.4              
## [35] ellipsis_0.3.2                DT_0.30                      
## [37] cachem_1.0.8                  mime_0.12                    
## [39] tidyselect_1.2.0              digest_0.6.33                
## [41] purrr_1.0.2                   dplyr_1.1.3                  
## [43] bookdown_0.36                 BiocVersion_3.19.1           
## [45] fastmap_1.1.1                 cli_3.6.1                    
## [47] magrittr_2.0.3                utf8_1.2.4                   
## [49] withr_2.5.2                   filelock_1.0.2               
## [51] promises_1.2.1                rappdirs_0.3.3               
## [53] bit64_4.0.5                   rmarkdown_2.25               
## [55] XVector_0.43.0                httr_1.4.7                   
## [57] bit_4.0.5                     png_0.1-8                    
## [59] memoise_2.0.1                 shiny_1.7.5.1                
## [61] evaluate_0.22                 knitr_1.45                   
## [63] IRanges_2.37.0                rlang_1.1.1                  
## [65] Rcpp_1.0.11                   xtable_1.8-4                 
## [67] glue_1.6.2                    DBI_1.1.3                    
## [69] BiocManager_1.30.22           jsonlite_1.8.7               
## [71] R6_2.5.1                      zlibbioc_1.49.0