RNAmodR.Data 1.8.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
## snapshotDate(): 2021-10-18
library(RNAmodR.Data)
eh <- ExperimentHub()
## snapshotDate(): 2021-10-18
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 cache
head(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.1.1 (2021-08-10)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.3 LTS
##
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.14-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.14-bioc/R/lib/libRlapack.so
##
## 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
##
## attached base packages:
## [1] stats4 stats graphics grDevices utils datasets methods
## [8] base
##
## other attached packages:
## [1] RNAmodR.Data_1.8.0 ExperimentHubData_1.20.0 AnnotationHubData_1.24.0
## [4] futile.logger_1.4.3 GenomicRanges_1.46.0 GenomeInfoDb_1.30.0
## [7] IRanges_2.28.0 S4Vectors_0.32.0 ExperimentHub_2.2.0
## [10] AnnotationHub_3.2.0 BiocFileCache_2.2.0 dbplyr_2.1.1
## [13] BiocGenerics_0.40.0 BiocStyle_2.22.0
##
## loaded via a namespace (and not attached):
## [1] rjson_0.2.20 ellipsis_0.3.2
## [3] XVector_0.34.0 getopt_1.20.3
## [5] bit64_4.0.5 interactiveDisplayBase_1.32.0
## [7] AnnotationDbi_1.56.1 fansi_0.5.0
## [9] xml2_1.3.2 codetools_0.2-18
## [11] cachem_1.0.6 knitr_1.36
## [13] jsonlite_1.7.2 Rsamtools_2.10.0
## [15] png_0.1-7 graph_1.72.0
## [17] shiny_1.7.1 BiocManager_1.30.16
## [19] compiler_4.1.1 httr_1.4.2
## [21] assertthat_0.2.1 Matrix_1.3-4
## [23] fastmap_1.1.0 later_1.3.0
## [25] formatR_1.11 htmltools_0.5.2
## [27] prettyunits_1.1.1 tools_4.1.1
## [29] glue_1.4.2 GenomeInfoDbData_1.2.7
## [31] dplyr_1.0.7 rappdirs_0.3.3
## [33] Rcpp_1.0.7 Biobase_2.54.0
## [35] jquerylib_0.1.4 vctrs_0.3.8
## [37] Biostrings_2.62.0 rtracklayer_1.54.0
## [39] optparse_1.7.1 xfun_0.27
## [41] stringr_1.4.0 mime_0.12
## [43] lifecycle_1.0.1 restfulr_0.0.13
## [45] XML_3.99-0.8 stringdist_0.9.8
## [47] zlibbioc_1.40.0 hms_1.1.1
## [49] promises_1.2.0.1 MatrixGenerics_1.6.0
## [51] BiocCheck_1.30.0 parallel_4.1.1
## [53] SummarizedExperiment_1.24.0 RBGL_1.70.0
## [55] lambda.r_1.2.4 yaml_2.2.1
## [57] curl_4.3.2 memoise_2.0.0
## [59] sass_0.4.0 biomaRt_2.50.0
## [61] stringi_1.7.5 RSQLite_2.2.8
## [63] BiocVersion_3.14.0 BiocIO_1.4.0
## [65] GenomicFeatures_1.46.1 filelock_1.0.2
## [67] BiocParallel_1.28.0 rlang_0.4.12
## [69] pkgconfig_2.0.3 matrixStats_0.61.0
## [71] bitops_1.0-7 evaluate_0.14
## [73] lattice_0.20-45 purrr_0.3.4
## [75] GenomicAlignments_1.30.0 bit_4.0.4
## [77] tidyselect_1.1.1 AnnotationForge_1.36.0
## [79] magrittr_2.0.1 bookdown_0.24
## [81] R6_2.5.1 generics_0.1.1
## [83] RUnit_0.4.32 DelayedArray_0.20.0
## [85] DBI_1.1.1 pillar_1.6.4
## [87] withr_2.4.2 biocViews_1.62.0
## [89] KEGGREST_1.34.0 RCurl_1.98-1.5
## [91] tibble_3.1.5 crayon_1.4.1
## [93] futile.options_1.0.1 utf8_1.2.2
## [95] OrganismDbi_1.36.0 rmarkdown_2.11
## [97] progress_1.2.2 grid_4.1.1
## [99] blob_1.2.2 digest_0.6.28
## [101] xtable_1.8-4 httpuv_1.6.3
## [103] bslib_0.3.1
Lestrade, 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.