RNAmodR.Data 1.23.0
RNAmodR.Data contains example data for the RNAmodR and related packages.
The data is provided as gff3, fasta and bam files.
Four sets of data with multiple files are included
## No methods found in package 'rtracklayer' for request: 'trackName<-' when loading 'AnnotationHubData'## Warning: replacing previous import 'utils::findMatches' by
## 'S4Vectors::findMatches' when loading 'ExperimentHubData'library(RNAmodR.Data)eh <- ExperimentHub()
ExperimentHub::listResources(eh, "RNAmodR.Data")##  [1] "RNAmodR.Data.example.fasta"     "RNAmodR.Data.example.gff3"     
##  [3] "RNAmodR.Data.example.bam.1"     "RNAmodR.Data.example.bam.2"    
##  [5] "RNAmodR.Data.example.bam.3"     "RNAmodR.Data.example.RMS.fasta"
##  [7] "RNAmodR.Data.example.RMS.gff3"  "RNAmodR.Data.example.RMS.1"    
##  [9] "RNAmodR.Data.example.RMS.2"     "RNAmodR.Data.example.AAS.fasta"
## [11] "RNAmodR.Data.example.AAS.gff3"  "RNAmodR.Data.example.bud23.1"  
## [13] "RNAmodR.Data.example.bud23.2"   "RNAmodR.Data.example.trm8.1"   
## [15] "RNAmodR.Data.example.trm8.2"    "RNAmodR.Data.example.wt.1"     
## [17] "RNAmodR.Data.example.wt.2"      "RNAmodR.Data.example.wt.3"     
## [19] "RNAmodR.Data.example.man.fasta" "RNAmodR.Data.example.man.gff3" 
## [21] "RNAmodR.Data.snoRNAdb"These resources are grouped based on topic. Please have a look at the following man pages:
?RNAmodR.Data.example for general example data used for different purposes?RNAmodR.Data.RMS for example data for RiboMethSeq?RNAmodR.Data.AAS for example data for AlkAnilineSeq?RNAmodR.Data.man for small data set for man page examples?RNAmodR.Data.snoRNAdb for snoRNAdb as csv fileRNAmodR.Data.snoRNAdb consists of a table containing the published data from
the snoRNAdb (Lestrade and Weber 2006). The can be loaded as a GRanges
object.
library(GenomicRanges)table <- read.csv2(RNAmodR.Data.snoRNAdb(), stringsAsFactors = FALSE)## see ?RNAmodR.Data and browseVignettes('RNAmodR.Data') for documentation## loading from cachehead(table, n = 2)# keep only the current coordinates
table <- table[,1:7]
snoRNAdb <- GRanges(seqnames = table$hgnc_symbol,
              ranges = IRanges(start = table$position, width = 1),strand = "+",
              type = "RNAMOD",
              mod = table$modification,
              Parent = table$hgnc_symbol,
              Activity = CharacterList(strsplit(table$guide,",")))
# convert to current gene name
snoRNAdb <- snoRNAdb[vapply(snoRNAdb$Activity != "unknown",all,logical(1)),]
snoRNAdb <- split(snoRNAdb,snoRNAdb$Parent)
head(snoRNAdb)## GRangesList object of length 6:
## $RNA18SN5
## GRanges object with 69 ranges and 4 metadata columns:
##        seqnames    ranges strand |        type         mod      Parent
##           <Rle> <IRanges>  <Rle> | <character> <character> <character>
##    [1] RNA18SN5        27      + |      RNAMOD          Am    RNA18SN5
##    [2] RNA18SN5        34      + |      RNAMOD           Y    RNA18SN5
##    [3] RNA18SN5        36      + |      RNAMOD           Y    RNA18SN5
##    [4] RNA18SN5        93      + |      RNAMOD           Y    RNA18SN5
##    [5] RNA18SN5        99      + |      RNAMOD          Am    RNA18SN5
##    ...      ...       ...    ... .         ...         ...         ...
##   [65] RNA18SN5      1643      + |      RNAMOD           Y    RNA18SN5
##   [66] RNA18SN5      1678      + |      RNAMOD          Am    RNA18SN5
##   [67] RNA18SN5      1692      + |      RNAMOD           Y    RNA18SN5
##   [68] RNA18SN5      1703      + |      RNAMOD          Cm    RNA18SN5
##   [69] RNA18SN5      1804      + |      RNAMOD          Um    RNA18SN5
##                              Activity
##                       <CharacterList>
##    [1]                        SNORD27
##    [2]               SNORA50A,SNORA76
##    [3]                SNORA69,SNORA55
##    [4]                        SNORA75
##    [5]                        SNORD57
##    ...                            ...
##   [65]                        SNORA41
##   [66]                        SNORD82
##   [67] SNORD70A,SNORD70B,SNORD70C,...
##   [68]                        SNORD43
##   [69]                        SNORD20
##   -------
##   seqinfo: 9 sequences from an unspecified genome; no seqlengths
## 
## ...
## <5 more elements>sessionInfo()## R version 4.5.0 beta (2025-04-02 r88102)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 24.04.2 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.22-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] RNAmodR.Data_1.23.0      ExperimentHubData_1.35.0 AnnotationHubData_1.39.0
##  [4] futile.logger_1.4.3      GenomicRanges_1.61.0     GenomeInfoDb_1.45.0     
##  [7] IRanges_2.43.0           S4Vectors_0.47.0         ExperimentHub_2.17.0    
## [10] AnnotationHub_3.17.0     BiocFileCache_2.17.0     dbplyr_2.5.0            
## [13] BiocGenerics_0.55.0      generics_0.1.3           BiocStyle_2.37.0        
## 
## loaded via a namespace (and not attached):
##  [1] DBI_1.2.3                   bitops_1.0-9               
##  [3] RBGL_1.85.0                 httr2_1.1.2                
##  [5] formatR_1.14                biomaRt_2.65.0             
##  [7] rlang_1.1.6                 magrittr_2.0.3             
##  [9] matrixStats_1.5.0           compiler_4.5.0             
## [11] RSQLite_2.3.9               GenomicFeatures_1.61.0     
## [13] png_0.1-8                   vctrs_0.6.5                
## [15] txdbmaker_1.5.0             stringr_1.5.1              
## [17] pkgconfig_2.0.3             crayon_1.5.3               
## [19] fastmap_1.2.0               XVector_0.49.0             
## [21] biocViews_1.77.0            Rsamtools_2.25.0           
## [23] rmarkdown_2.29              graph_1.87.0               
## [25] UCSC.utils_1.5.0            purrr_1.0.4                
## [27] bit_4.6.0                   xfun_0.52                  
## [29] cachem_1.1.0                jsonlite_2.0.0             
## [31] progress_1.2.3              blob_1.2.4                 
## [33] DelayedArray_0.35.0         BiocParallel_1.43.0        
## [35] parallel_4.5.0              prettyunits_1.2.0          
## [37] R6_2.6.1                    bslib_0.9.0                
## [39] stringi_1.8.7               rtracklayer_1.69.0         
## [41] jquerylib_0.1.4             bookdown_0.43              
## [43] SummarizedExperiment_1.39.0 knitr_1.50                 
## [45] BiocBaseUtils_1.11.0        Matrix_1.7-3               
## [47] tidyselect_1.2.1            stringdist_0.9.15          
## [49] abind_1.4-8                 yaml_2.3.10                
## [51] codetools_0.2-20            RUnit_0.4.33               
## [53] curl_6.2.2                  lattice_0.22-7             
## [55] tibble_3.2.1                withr_3.0.2                
## [57] Biobase_2.69.0              KEGGREST_1.49.0            
## [59] evaluate_1.0.3              AnnotationForge_1.51.0     
## [61] lambda.r_1.2.4              xml2_1.3.8                 
## [63] Biostrings_2.77.0           pillar_1.10.2              
## [65] BiocManager_1.30.25         filelock_1.0.3             
## [67] MatrixGenerics_1.21.0       OrganismDbi_1.51.0         
## [69] RCurl_1.98-1.17             BiocVersion_3.22.0         
## [71] hms_1.1.3                   BiocCheck_1.45.0           
## [73] glue_1.8.0                  tools_4.5.0                
## [75] BiocIO_1.19.0               GenomicAlignments_1.45.0   
## [77] XML_3.99-0.18               grid_4.5.0                 
## [79] AnnotationDbi_1.71.0        GenomeInfoDbData_1.2.14    
## [81] restfulr_0.0.15             cli_3.6.4                  
## [83] rappdirs_0.3.3              futile.options_1.0.1       
## [85] S4Arrays_1.9.0              dplyr_1.1.4                
## [87] sass_0.4.10                 digest_0.6.37              
## [89] SparseArray_1.9.0           rjson_0.2.23               
## [91] memoise_2.0.1               htmltools_0.5.8.1          
## [93] lifecycle_1.0.4             httr_1.4.7                 
## [95] mime_0.13                   bit64_4.6.0-1Lestrade, Laurent, and Michel J. Weber. 2006. “snoRNA-LBME-db, a comprehensive database of human H/ACA and C/D box snoRNAs.” Nucleic Acids Research 34 (January): D158–D162. https://doi.org/10.1093/nar/gkj002.