RNAmodR.Data 1.14.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
## Warning: replacing previous import 'utils::findMatches' by
## 'S4Vectors::findMatches' when loading 'AnnotationDbi'## Warning: replacing previous import 'utils::findMatches' by
## 'S4Vectors::findMatches' when loading 'AnnotationForge'## 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.3.0 RC (2023-04-13 r84269)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.2 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.17-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] RNAmodR.Data_1.14.0      ExperimentHubData_1.26.0 AnnotationHubData_1.30.0
##  [4] futile.logger_1.4.3      GenomicRanges_1.52.0     GenomeInfoDb_1.36.0     
##  [7] IRanges_2.34.0           S4Vectors_0.38.0         ExperimentHub_2.8.0     
## [10] AnnotationHub_3.8.0      BiocFileCache_2.8.0      dbplyr_2.3.2            
## [13] BiocGenerics_0.46.0      BiocStyle_2.28.0        
## 
## loaded via a namespace (and not attached):
##   [1] DBI_1.1.3                     bitops_1.0-7                 
##   [3] RBGL_1.76.0                   formatR_1.14                 
##   [5] biomaRt_2.56.0                rlang_1.1.0                  
##   [7] magrittr_2.0.3                matrixStats_0.63.0           
##   [9] compiler_4.3.0                RSQLite_2.3.1                
##  [11] GenomicFeatures_1.52.0        png_0.1-8                    
##  [13] vctrs_0.6.2                   stringr_1.5.0                
##  [15] pkgconfig_2.0.3               crayon_1.5.2                 
##  [17] fastmap_1.1.1                 XVector_0.40.0               
##  [19] ellipsis_0.3.2                utf8_1.2.3                   
##  [21] biocViews_1.68.0              Rsamtools_2.16.0             
##  [23] promises_1.2.0.1              rmarkdown_2.21               
##  [25] graph_1.78.0                  purrr_1.0.1                  
##  [27] bit_4.0.5                     xfun_0.39                    
##  [29] zlibbioc_1.46.0               cachem_1.0.7                 
##  [31] jsonlite_1.8.4                progress_1.2.2               
##  [33] blob_1.2.4                    later_1.3.0                  
##  [35] DelayedArray_0.26.0           BiocParallel_1.34.0          
##  [37] interactiveDisplayBase_1.38.0 parallel_4.3.0               
##  [39] prettyunits_1.1.1             R6_2.5.1                     
##  [41] bslib_0.4.2                   stringi_1.7.12               
##  [43] rtracklayer_1.60.0            jquerylib_0.1.4              
##  [45] Rcpp_1.0.10                   bookdown_0.33                
##  [47] SummarizedExperiment_1.30.0   knitr_1.42                   
##  [49] httpuv_1.6.9                  Matrix_1.5-4                 
##  [51] tidyselect_1.2.0              stringdist_0.9.10            
##  [53] yaml_2.3.7                    codetools_0.2-19             
##  [55] RUnit_0.4.32                  curl_5.0.0                   
##  [57] lattice_0.21-8                tibble_3.2.1                 
##  [59] withr_2.5.0                   Biobase_2.60.0               
##  [61] shiny_1.7.4                   KEGGREST_1.40.0              
##  [63] evaluate_0.20                 lambda.r_1.2.4               
##  [65] AnnotationForge_1.42.0        xml2_1.3.3                   
##  [67] Biostrings_2.68.0             pillar_1.9.0                 
##  [69] BiocManager_1.30.20           filelock_1.0.2               
##  [71] MatrixGenerics_1.12.0         OrganismDbi_1.42.0           
##  [73] generics_0.1.3                RCurl_1.98-1.12              
##  [75] BiocVersion_3.17.1            hms_1.1.3                    
##  [77] BiocCheck_1.36.0              xtable_1.8-4                 
##  [79] glue_1.6.2                    tools_4.3.0                  
##  [81] BiocIO_1.10.0                 GenomicAlignments_1.36.0     
##  [83] XML_3.99-0.14                 grid_4.3.0                   
##  [85] AnnotationDbi_1.62.0          GenomeInfoDbData_1.2.10      
##  [87] restfulr_0.0.15               cli_3.6.1                    
##  [89] rappdirs_0.3.3                futile.options_1.0.1         
##  [91] fansi_1.0.4                   dplyr_1.1.2                  
##  [93] sass_0.4.5                    digest_0.6.31                
##  [95] rjson_0.2.21                  memoise_2.0.1                
##  [97] htmltools_0.5.5               lifecycle_1.0.3              
##  [99] httr_1.4.5                    mime_0.12                    
## [101] bit64_4.0.5Lestrade, 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.