EpiTxDb 1.2.1
if (!requireNamespace("BiocManager", quietly = TRUE))
install.packages("BiocManager")
BiocManager::install(c("EpiTxDb","EpiTxDb.Hs.hg38"))
The epitranscriptome includes all post-transcriptional modifications of the RNA and describes and additional layer of information encoded on RNA. Like the term epigenome it is not about a change in nucleotide sequences, but the addition of functional elements through modifications.
With the development of high throughput detection strategies for specific RNA modifications, such as miCLIP and Pseudo-Seq amongst other, a large number of modified positions have been identified and were summarized via the RMBase project (Xuan et al. 2017; Sun et al. 2015) project.
To make these information avaialble within the Bioconductor universe EpiTxDb
was developed, which facilitates the storage of epitranscriptomic information.
More specifically, it can keep track of modification identity, position, the
enzyme for introducing it on the RNA, a specifier which determines the position
on the RNA to be modified and the literature references each modification is
associated with.
library(EpiTxDb)
library(EpiTxDb.Hs.hg38)
The class EpiTxDb
is the class for storing the epitranscriptomic data. It
inherits the inner workings of AnnotationDb
class from the AnnotationDbi
package.
As an example for the vignette the snoRNAdb data (Lestrade and Weber 2006)
from the EpiTxDb.Hs.hg38
package will be used. The data is stored in the
AnnotationHub
and is downloaded and cached upon the first request.
etdb <- EpiTxDb.Hs.hg38.snoRNAdb()
## snapshotDate(): 2020-10-27
## loading from cache
etdb
## EpiTxDb object:
## # Db type: EpiTxDb
## # Supporting package: EpiTxDb
## # Data source: snoRNAdb
## # Organism: Homo sapiens
## # Genome: hg38
## # Coordinates: per Transcript
## # Nb of modifications: 235
## # Db created by: EpiTxDb package from Bioconductor
## # Creation time: 2020-02-26 10:34:30 +0100 (Wed, 26 Feb 2020)
## # EpiTxDb version at creation time: 0.99.0
## # RSQLite version at creation time: 2.2.0
## # DBSCHEMAVERSION: 1.0
As expected for an AnnotationDb
class the general accessors are available.
keytypes(etdb)
## [1] "MODID" "MODNAME" "MODSTRAND" "MODTYPE"
## [5] "REF" "REFTYPE" "RXENSEMBL" "RXENSEMBLTRANS"
## [9] "RXENTREZID" "RXGENENAME" "SNID" "SNNAME"
## [13] "SPECENSEMBL" "SPECENSEMBLTRANS" "SPECENTREZID" "SPECGENENAME"
## [17] "SPECTYPE"
columns(etdb)
## [1] "MODEND" "MODID" "MODNAME" "MODSTART"
## [5] "MODSTRAND" "MODTYPE" "REF" "REFID"
## [9] "REFTYPE" "RXENSEMBL" "RXENSEMBLTRANS" "RXENTREZID"
## [13] "RXGENENAME" "RXID" "RXRANK" "SNID"
## [17] "SNNAME" "SPECENSEMBL" "SPECENSEMBLTRANS" "SPECENTREZID"
## [21] "SPECGENENAME" "SPECID" "SPECTYPE"
head(keys(etdb, "MODID"))
## [1] "1" "2" "3" "4" "5" "6"
select(etdb, keys = "1",
columns = c("MODNAME","MODTYPE","MODSTART","MODSTRAND","SNNAME",
"RXGENENAME","SPECTYPE","SPECGENENAME"),
keytype = "MODID")
## 'select()' returned 1:1 mapping between keys and columns
The columns with the prefix RX
or SPEC
reference the reaction enzyme and the
location specifier. This can be the same information, but for ribosomal
modifications from the snoRNAdb it is of course fibrillarin and a snoRNA.
In addition the following accessor for metadata are available as well.
species(etdb)
## [1] "Homo sapiens"
organism(etdb)
## [1] "Homo sapiens"
seqlevels(etdb)
## [1] "NR_003285" "NR_003286" "NR_003287" "NR_004430" "NR_002716" "NR_003925"
## [7] "NR_002756" "NR_004394" "NR_029422"
The specialized accessors are modifications()
and modificationsBy()
.
modifications()
allows for filtering results, whereas modificationsBy()
returns all the modifications in batches separated by certain information.
modifications(etdb, columns = c("mod_id","mod_type","mod_name",
"rx_genename","spec_genename",
"ref_type","ref"),
filter = list(mod_id = 1:3))
## GRanges object with 3 ranges and 7 metadata columns:
## seqnames ranges strand | mod_id mod_type mod_name
## <Rle> <IRanges> <Rle> | <integer> <character> <character>
## [1] NR_003285 14 + | 1 Um Um_14
## [2] NR_003285 55 + | 2 Y Y_55
## [3] NR_003285 69 + | 3 Y Y_69
## rx_genename spec_genename ref_type ref
## <CharacterList> <CharacterList> <CharacterList> <CharacterList>
## [1] fibrillarin SNORD71 PMID 16381836
## [2] dyskerin pseudouridi.. SNORA72 PMID 16381836
## [3] dyskerin pseudouridi.. SNORA69 PMID 16381836
## -------
## seqinfo: 9 sequences from hg38 genome; no seqlengths
# split by sequence name, usually a transcipt identifier
modificationsBy(etdb, by = "seqnames")
## GRangesList object of length 9:
## $NR_003285
## GRanges object with 4 ranges and 3 metadata columns:
## seqnames ranges strand | mod_id mod mod_name
## <Rle> <IRanges> <Rle> | <integer> <character> <character>
## [1] NR_003285 14 + | 1 Um Um_14
## [2] NR_003285 55 + | 2 Y Y_55
## [3] NR_003285 69 + | 3 Y Y_69
## [4] NR_003285 75 + | 4 Gm Gm_75
## -------
## seqinfo: 9 sequences from hg38 genome; no seqlengths
##
## ...
## <8 more elements>
# split modification type
modificationsBy(etdb, by = "modtype")
## GRangesList object of length 5:
## $Am
## GRanges object with 39 ranges and 3 metadata columns:
## seqnames ranges strand | mod mod_id mod_name
## <Rle> <IRanges> <Rle> | <character> <integer> <character>
## [1] NR_003286 27 + | Am 5 Am_27
## [2] NR_003286 99 + | Am 9 Am_99
## [3] NR_003286 159 + | Am 15 Am_159
## [4] NR_003286 166 + | Am 16 Am_166
## [5] NR_003286 468 + | Am 25 Am_468
## ... ... ... ... . ... ... ...
## [35] NR_002716 30 + | Am 207 Am_30
## [36] NR_003925 65 + | Am 216 Am_65
## [37] NR_004394 47 + | Am 226 Am_47
## [38] NR_004394 53 + | Am 227 Am_53
## [39] NR_004394 53 + | Am 228 Am_53
## -------
## seqinfo: 9 sequences from hg38 genome; no seqlengths
##
## ...
## <4 more elements>
Since epitranscriptomic modifications by their nature can have different meaning for each of the individual transcript variants, this can introduce conflicts from how epitranscriptomics coordinates are saved. In the example above the coordinates are given per transcript, because of the origin of the data.
However, not all sources report transcript coordinates. It might be of interest to shift the genomic coordinates to transcript coordinates and at the same time take care, that the transcript maturation processes can lead to more than one result: From one genomic coordinate, multiple transcriptomic coordinates can be derived.
Whether this is biologically relevant or whether biological evidence does exist for each modification on each transcript cannot be guaranteed or differentiated technically depending on the methods used. This might change with the arrival of new techniques allowing for detection of modified nucleotides per individual transcript variant.
library(TxDb.Hsapiens.UCSC.hg38.knownGene)
library(BSgenome.Hsapiens.UCSC.hg38)
txdb <- TxDb.Hsapiens.UCSC.hg38.knownGene
seqlevels(txdb) <- "chr1"
bs <- BSgenome.Hsapiens.UCSC.hg38
etdb <- EpiTxDb.Hs.hg38.RMBase()
## snapshotDate(): 2020-10-27
## loading from cache
tx <- exonsBy(txdb)
mod <- modifications(etdb, filter = list(sn_name = "chr1"))
length(mod)
## [1] 47275
In the following example we will focus on shifting the coordinates to individual
mature transcripts. However, keep in mind, that premature transcript might be
of interest as well and this can be controlled via the tx
arguments of
shiftGenomicToTranscript()
mod_tx <- shiftGenomicToTranscript(mod, tx)
## Warning: Coordinates for 905 ranges of 'subject' not found:
## 'chr1:14662:-','chr1:14668:-','chr1:14766:-','chr1:139005:-','chr1:139020:-','chr1:139040:-','chr1:139127:-','chr1:629454:+','chr1:629456:+','chr1:629465:+'
## and more ...
length(mod_tx)
## [1] 157694
Due to multiple matches for each transcript variant the number of modifications has increased.
With the we can plot the relative positions of modifications by type on
chr1
transcripts.
mod_tx <- split(mod_tx,seqnames(mod_tx))
names <- Reduce(intersect,list(names(mod_tx),names(tx)))
# Getting the corresponding 5'-UTR and 3'-UTR annotations
fp <- fiveUTRsByTranscript(txdb)
tp <- threeUTRsByTranscript(txdb)
tx <- tx[names]
mod_tx <- mod_tx[names]
fp_m <- match(names,names(fp))
fp_m <- fp_m[!is.na(fp_m)]
tp_m <- match(names,names(tp))
tp_m <- tp_m[!is.na(tp_m)]
fp <- fp[fp_m]
tp <- tp[tp_m]
# Getting lengths of transcripts, 5'-UTR and 3'-UTR
tx_lengths <- sum(width(tx))
fp_lengths <- rep(0L,length(tx))
names(fp_lengths) <- names
fp_lengths[names(fp)] <- sum(width(fp))
tp_lengths <- rep(0L,length(tx))
names(tp_lengths) <- names
tp_lengths[names(tp)] <- sum(width(tp))
# Rescale modifications
# CDS start is at position 1L and cds end at position 1000L
from <- IRanges(fp_lengths+1L, tx_lengths - tp_lengths)
to <- IRanges(1L,1000L)
mod_rescale <- rescale(mod_tx, to, from)
# Construct result data.frame
rel_pos <- data.frame(mod_type = unlist(mcols(mod_rescale,level="within")[,"mod_type"]),
rel_pos = unlist(start(mod_rescale)))
rel_pos <- rel_pos[rel_pos$rel_pos < 1500 & rel_pos$rel_pos > -500,]
library(ggplot2)
ggplot(rel_pos[rel_pos$mod_type %in% c("m6A","m1A","Y"),],
aes(x = rel_pos, colour = mod_type)) +
geom_density()
sessionInfo()
## R version 4.0.4 (2021-02-15)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.5 LTS
##
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.12-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.12-bioc/R/lib/libRlapack.so
##
## locale:
## [1] LC_CTYPE=en_US.UTF-8 LC_NUMERIC=C
## [3] LC_TIME=en_US.UTF-8 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] parallel stats4 stats graphics grDevices utils datasets
## [8] methods base
##
## other attached packages:
## [1] ggplot2_3.3.3
## [2] BSgenome.Hsapiens.UCSC.hg38_1.4.3
## [3] BSgenome_1.58.0
## [4] rtracklayer_1.50.0
## [5] TxDb.Hsapiens.UCSC.hg38.knownGene_3.10.0
## [6] GenomicFeatures_1.42.2
## [7] EpiTxDb.Hs.hg38_0.99.7
## [8] AnnotationHub_2.22.0
## [9] BiocFileCache_1.14.0
## [10] dbplyr_2.1.0
## [11] EpiTxDb_1.2.1
## [12] Modstrings_1.6.0
## [13] Biostrings_2.58.0
## [14] XVector_0.30.0
## [15] AnnotationDbi_1.52.0
## [16] Biobase_2.50.0
## [17] GenomicRanges_1.42.0
## [18] GenomeInfoDb_1.26.4
## [19] IRanges_2.24.1
## [20] S4Vectors_0.28.1
## [21] BiocGenerics_0.36.0
## [22] BiocStyle_2.18.1
##
## loaded via a namespace (and not attached):
## [1] bitops_1.0-6 matrixStats_0.58.0
## [3] bit64_4.0.5 progress_1.2.2
## [5] httr_1.4.2 tools_4.0.4
## [7] bslib_0.2.4 utf8_1.2.1
## [9] R6_2.5.0 DBI_1.1.1
## [11] colorspace_2.0-0 withr_2.4.1
## [13] tidyselect_1.1.0 prettyunits_1.1.1
## [15] bit_4.0.4 curl_4.3
## [17] compiler_4.0.4 xml2_1.3.2
## [19] DelayedArray_0.16.3 labeling_0.4.2
## [21] bookdown_0.21 sass_0.3.1
## [23] scales_1.1.1 tRNA_1.8.0
## [25] askpass_1.1 rappdirs_0.3.3
## [27] stringr_1.4.0 digest_0.6.27
## [29] Rsamtools_2.6.0 rmarkdown_2.7
## [31] pkgconfig_2.0.3 htmltools_0.5.1.1
## [33] MatrixGenerics_1.2.1 highr_0.8
## [35] fastmap_1.1.0 rlang_0.4.10
## [37] RSQLite_2.2.4 shiny_1.6.0
## [39] farver_2.1.0 jquerylib_0.1.3
## [41] generics_0.1.0 jsonlite_1.7.2
## [43] BiocParallel_1.24.1 dplyr_1.0.5
## [45] RCurl_1.98-1.3 magrittr_2.0.1
## [47] GenomeInfoDbData_1.2.4 Matrix_1.3-2
## [49] Rcpp_1.0.6 munsell_0.5.0
## [51] fansi_0.4.2 lifecycle_1.0.0
## [53] stringi_1.5.3 yaml_2.2.1
## [55] debugme_1.1.0 SummarizedExperiment_1.20.0
## [57] zlibbioc_1.36.0 grid_4.0.4
## [59] blob_1.2.1 promises_1.2.0.1
## [61] crayon_1.4.1 lattice_0.20-41
## [63] tRNAdbImport_1.8.0 hms_1.0.0
## [65] magick_2.7.1 knitr_1.31
## [67] pillar_1.5.1 biomaRt_2.46.3
## [69] XML_3.99-0.6 glue_1.4.2
## [71] BiocVersion_3.12.0 evaluate_0.14
## [73] Structstrings_1.6.1 BiocManager_1.30.10
## [75] vctrs_0.3.6 httpuv_1.5.5
## [77] gtable_0.3.0 openssl_1.4.3
## [79] purrr_0.3.4 assertthat_0.2.1
## [81] cachem_1.0.4 xfun_0.22
## [83] mime_0.10 xtable_1.8-4
## [85] later_1.1.0.1 tibble_3.1.0
## [87] GenomicAlignments_1.26.0 memoise_2.0.0
## [89] ellipsis_0.3.1 interactiveDisplayBase_1.28.0
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.
Sun, Wen-Ju, Jun-Hao Li, Shun Liu, Jie Wu, Hui Zhou, Liang-Hu Qu, and Jian-Hua Yang. 2015. “RMBase: a resource for decoding the landscape of RNA modifications from high-throughput sequencing data.” Nucleic Acids Research 44 (D1): D259–D265. https://doi.org/10.1093/nar/gkv1036.
Xuan, Jia-Jia, Wen-Ju Sun, Peng-Hui Lin, Ke-Ren Zhou, Shun Liu, Ling-Ling Zheng, Liang-Hu Qu, and Jian-Hua Yang. 2017. “RMBase v2.0: deciphering the map of RNA modifications from epitranscriptome sequencing data.” Nucleic Acids Research 46 (D1): D327–D334. https://doi.org/10.1093/nar/gkx934.