Among the various post-transcriptional RNA modifications, 2’-O methylations are commonly found in rRNA and tRNA. They promote the endo conformation of the ribose and confere resistance to alkaline degradation by preventing a nucleophilic attack on the 3’-phosphate especially in flexible RNA, which is fascilitated by high pH conditions. This property can be queried using a method called RiboMethSeq [Birkedal et al. (2015)] for which RNA is treated in alkaline conditions and RNA fragments are used to prepare a sequencing library [Marchand et al. (2017)].
At position containing a 2’-O methylations, read ends are less frequent, which is used to detect and score the 2’-O methylations.
The ModRiboMethSeq class uses the the ProtectedEndSequenceData class to
store and aggregate data along the transcripts. The calculated scores follow the
nomenclature of [Birkedal et al. (2015);Galvanin et al. (2019)] with the names
scoreRMS (default), scoreA, scoreB and scoreMean.
## snapshotDate(): 2020-04-27library(rtracklayer)
library(GenomicRanges)
library(RNAmodR.RiboMethSeq)
library(RNAmodR.Data)The example workflow is limited to two 2’-O methylated position on 5.8S rRNA,
since the size of the raw data is limited. For annotation data either a gff file
or a TxDb object and for sequence data a fasta file or a BSgenome object can
be used. The data is provided as bam files.
annotation <- GFF3File(RNAmodR.Data.example.RMS.gff3())
sequences <- RNAmodR.Data.example.RMS.fasta()
files <- list("Sample1" = c(treated = RNAmodR.Data.example.RMS.1()),
              "Sample2" = c(treated = RNAmodR.Data.example.RMS.2()))The analysis is triggered by the construction of a ModSetRiboMethSeq object.
Internally parallelization is used via the BiocParallel package, which would
allow optimization depending on number/size of input files (number of samples,
number of replicates, number of transcripts, etc).
msrms <- ModSetRiboMethSeq(files, annotation = annotation, sequences = sequences)## Import genomic features from the file as a GRanges object ... OK
## Prepare the 'metadata' data frame ... OK
## Make the TxDb object ... OKmsrms## ModSetRiboMethSeq of length 2
## names(2): Sample1 Sample2
## | Modification type(s):  Am / Cm / Gm / Um                                      
##                        Sample1 Sample2
## | Modifications found:      no yes (1)
## | Settings:
##         minCoverage minReplicate  find.mod maxLength minSignal flankingRegion
##           <integer>    <integer> <logical> <integer> <integer>      <integer>
## Sample1          10            1      TRUE        50        10              6
## Sample2          10            1      TRUE        50        10              6
##         minScoreA minScoreB minScoreRMS minScoreMean flankingRegionMean
##         <numeric> <numeric>   <numeric>    <numeric>          <integer>
## Sample1       0.6       3.6        0.75         0.75                  2
## Sample2       0.6       3.6        0.75         0.75                  2
##                 weights
##           <NumericList>
## Sample1 0.9,1.0,0.0,...
## Sample2 0.9,1.0,0.0,...
##         scoreOperator
##           <character>
## Sample1             &
## Sample2             &To compare samples, we need to know, which positions should be part of the comparison. This can either be done by aggregating the detect over all samples and use the union or intersect or by using publish data. We want to assemble a GRanges object from the latter by utilising the infomation from the snoRNAdb [Lestrade and Weber (2006)].
In this specific example only information for the 5.8S RNA is used, since the
example data would be to big otherwise. The information regarding the parent and
seqname must match the information used as the annotation data. Check that it
matches the output of ranges() on a SequenceData, Modifier oder
ModifierSet object.
table <- read.csv2(RNAmodR.Data.snoRNAdb(), stringsAsFactors = FALSE)## snapshotDate(): 2020-04-27## see ?RNAmodR.Data and browseVignettes('RNAmodR.Data') for documentation## loading from cachetable <- table[table$hgnc_id == "53533",] # Subset to RNA5.8S
# keep only the current coordinates
table <- table[,1L:7L]
snoRNAdb <- GRanges(seqnames = "chr1",
              ranges = IRanges(start = table$position,
                               width = 1),
              strand = "+",
              type = "RNAMOD",
              mod = table$modification,
              Parent = "1", #this is the transcript id
              Activity = IRanges::CharacterList(strsplit(table$guide,",")))
coord <- split(snoRNAdb,snoRNAdb$Parent)In addition to the coordinates of published, we also want to include more
meaningful names for the transcripts. For this we provide a data.frame with
two columns, tx_id and name. All values in the first column have to match
transcript IDs.
ranges(msrms)## GRangesList object of length 1:
## $`1`
## GRanges object with 1 range and 3 metadata columns:
##       seqnames    ranges strand |   exon_id   exon_name exon_rank
##          <Rle> <IRanges>  <Rle> | <integer> <character> <integer>
##   [1]     chr1     1-157      + |         1 NR_003285.2         1
##   -------
##   seqinfo: 1 sequence from an unspecified genome; no seqlengthsalias <- data.frame(tx_id = "1", name = "5.8S rRNA", stringsAsFactors = FALSE)plotCompareByCoord(msrms[c(2L,1L)], coord, alias = alias)
Figure 1: Heatmap showing RiboMethSeq scores for 2’-O methylated positions on the 5.8S rRNA
Results can also be compared on a sequence level, by selecting specific coordinates to compare.
singleCoord <- coord[[1L]][1L,]
plotDataByCoord(msrms, singleCoord)
Figure 2: RiboMethSeq scores around Um(14) on 5.8S rRNA
By default only the RiboMethSeq score and the ScoreMean are shown. The raw sequence data can be inspected as well
singleCoord <- coord[[1L]][1L,]
plotDataByCoord(msrms, singleCoord, showSequenceData = TRUE)
Figure 3: RiboMethSeq scores around Um(14) on 5.8S rRNA
Sequence data is shown by setting showSequenceData = TRUE.
To access the performance of the method in combination with samples used, use
the plotROC function.
plotROC(msrms,coord)
Figure 4: TPR versus FPR plot
The example given here should be regarded as a proof of concept. Based on the results, minimal scores for calling modified positions can be adjusted to the individual requirements.
settings(msrms) <- list(minScoreMean = 0.7)
msrms## ModSetRiboMethSeq of length 2
## names(2): Sample1 Sample2
## | Modification type(s):  Am / Cm / Gm / Um                                      
##                        Sample1 Sample2
## | Modifications found:      no yes (1)
## | Settings:
##         minCoverage minReplicate  find.mod maxLength minSignal flankingRegion
##           <integer>    <integer> <logical> <integer> <integer>      <integer>
## Sample1          10            1      TRUE        50        10              6
## Sample2          10            1      TRUE        50        10              6
##         minScoreA minScoreB minScoreRMS minScoreMean flankingRegionMean
##         <numeric> <numeric>   <numeric>    <numeric>          <integer>
## Sample1       0.6       3.6        0.75          0.7                  2
## Sample2       0.6       3.6        0.75          0.7                  2
##                 weights
##           <NumericList>
## Sample1 0.9,1.0,0.0,...
## Sample2 0.9,1.0,0.0,...
##         scoreOperator
##           <character>
## Sample1             &
## Sample2             &## Warning: Settings were changed after data aggregation or modification search.
## Rerun with modify(x,force = TRUE) to update with current settings.As the warning suggested, after modifying the settings the results should be
updated by running modify(x,force = TRUE).
msrms2 <- modify(msrms,force = TRUE)sessionInfo()## R version 4.0.0 (2020-04-24)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.4 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.11-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.11-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] Rsamtools_2.4.0           RNAmodR.Data_1.1.2       
##  [3] ExperimentHubData_1.14.0  AnnotationHubData_1.18.0 
##  [5] futile.logger_1.4.3       ExperimentHub_1.14.0     
##  [7] AnnotationHub_2.20.0      BiocFileCache_1.12.0     
##  [9] dbplyr_1.4.3              RNAmodR.RiboMethSeq_1.2.0
## [11] RNAmodR_1.2.0             Modstrings_1.4.0         
## [13] Biostrings_2.56.0         XVector_0.28.0           
## [15] rtracklayer_1.48.0        GenomicRanges_1.40.0     
## [17] GenomeInfoDb_1.24.0       IRanges_2.22.0           
## [19] S4Vectors_0.26.0          BiocGenerics_0.34.0      
## [21] BiocStyle_2.16.0         
## 
## loaded via a namespace (and not attached):
##   [1] backports_1.1.6               Hmisc_4.4-0                  
##   [3] plyr_1.8.6                    assertive.files_0.0-2        
##   [5] lazyeval_0.2.2                splines_4.0.0                
##   [7] BiocParallel_1.22.0           ggplot2_3.3.0                
##   [9] digest_0.6.25                 ensembldb_2.12.0             
##  [11] htmltools_0.4.0               magick_2.3                   
##  [13] gdata_2.18.0                  magrittr_1.5                 
##  [15] checkmate_2.0.0               memoise_1.1.0                
##  [17] BSgenome_1.56.0               assertive.datetimes_0.0-2    
##  [19] assertive.numbers_0.0-2       cluster_2.1.0                
##  [21] ROCR_1.0-7                    matrixStats_0.56.0           
##  [23] askpass_1.1                   prettyunits_1.1.1            
##  [25] jpeg_0.1-8.1                  colorspace_1.4-1             
##  [27] blob_1.2.1                    rappdirs_0.3.1               
##  [29] assertive.strings_0.0-3       xfun_0.13                    
##  [31] dplyr_0.8.5                   jsonlite_1.6.1               
##  [33] crayon_1.3.4                  RCurl_1.98-1.2               
##  [35] graph_1.66.0                  survival_3.1-12              
##  [37] VariantAnnotation_1.34.0      glue_1.4.0                   
##  [39] gtable_0.3.0                  zlibbioc_1.34.0              
##  [41] DelayedArray_0.14.0           scales_1.1.0                 
##  [43] futile.options_1.0.1          DBI_1.1.0                    
##  [45] assertive.data.uk_0.0-2       assertive.models_0.0-2       
##  [47] Rcpp_1.0.4.6                  assertive.code_0.0-3         
##  [49] xtable_1.8-4                  progress_1.2.2               
##  [51] htmlTable_1.13.3              foreign_0.8-79               
##  [53] bit_1.1-15.2                  OrganismDbi_1.30.0           
##  [55] assertive.data.us_0.0-2       Formula_1.2-3                
##  [57] AnnotationForge_1.30.0        getopt_1.20.3                
##  [59] htmlwidgets_1.5.1             httr_1.4.1                   
##  [61] gplots_3.0.3                  RColorBrewer_1.1-2           
##  [63] acepack_1.4.1                 ellipsis_0.3.0               
##  [65] farver_2.0.3                  pkgconfig_2.0.3              
##  [67] XML_3.99-0.3                  Gviz_1.32.0                  
##  [69] nnet_7.3-14                   labeling_0.3                 
##  [71] later_1.0.0                   tidyselect_1.0.0             
##  [73] rlang_0.4.5                   reshape2_1.4.4               
##  [75] AnnotationDbi_1.50.0          biocViews_1.56.0             
##  [77] munsell_0.5.0                 BiocVersion_3.11.1           
##  [79] tools_4.0.0                   RSQLite_2.2.0                
##  [81] assertive.reflection_0.0-4    fastmap_1.0.1                
##  [83] evaluate_0.14                 stringr_1.4.0                
##  [85] yaml_2.2.1                    knitr_1.28                   
##  [87] bit64_0.9-7                   assertive.matrices_0.0-2     
##  [89] caTools_1.18.0                purrr_0.3.4                  
##  [91] AnnotationFilter_1.12.0       assertive.sets_0.0-3         
##  [93] RBGL_1.64.0                   mime_0.9                     
##  [95] formatR_1.7                   biomaRt_2.44.0               
##  [97] compiler_4.0.0                rstudioapi_0.11              
##  [99] curl_4.3                      png_0.1-7                    
## [101] interactiveDisplayBase_1.26.0 tibble_3.0.1                 
## [103] stringi_1.4.6                 highr_0.8                    
## [105] GenomicFeatures_1.40.0        lattice_0.20-41              
## [107] assertive.base_0.0-7          ProtGenerics_1.20.0          
## [109] Matrix_1.2-18                 assertive.data_0.0-3         
## [111] vctrs_0.2.4                   stringdist_0.9.5.5           
## [113] BiocCheck_1.24.0              pillar_1.4.3                 
## [115] lifecycle_0.2.0               optparse_1.6.6               
## [117] RUnit_0.4.32                  BiocManager_1.30.10          
## [119] data.table_1.12.8             bitops_1.0-6                 
## [121] httpuv_1.5.2                  colorRamps_2.3               
## [123] assertive.types_0.0-3         R6_2.4.1                     
## [125] latticeExtra_0.6-29           promises_1.1.0               
## [127] bookdown_0.18                 assertive.properties_0.0-4   
## [129] KernSmooth_2.23-17            gridExtra_2.3                
## [131] codetools_0.2-16              lambda.r_1.2.4               
## [133] dichromat_2.0-0               gtools_3.8.2                 
## [135] assertthat_0.2.1              SummarizedExperiment_1.18.0  
## [137] openssl_1.4.1                 rBiopaxParser_2.28.0         
## [139] GenomicAlignments_1.24.0      GenomeInfoDbData_1.2.3       
## [141] hms_0.5.3                     grid_4.0.0                   
## [143] rpart_4.1-15                  rmarkdown_2.1                
## [145] biovizBase_1.36.0             Biobase_2.48.0               
## [147] shiny_1.4.0.2                 base64enc_0.1-3              
## [149] assertive_0.3-5Birkedal, Ulf, Mikkel Christensen-Dalsgaard, Nicolai Krogh, Radhakrishnan Sabarinathan, Jan Gorodkin, and Henrik Nielsen. 2015. “Profiling of Ribose Methylations in Rna by High-Throughput Sequencing.” Angewandte Chemie (International Ed. In English) 54 (2):451–55. https://doi.org/10.1002/anie.201408362.
Galvanin, Adeline, Lilia Ayadi, Mark Helm, Yuri Motorin, and Virginie Marchand. 2019. “Mapping and Quantification of tRNA 2’-O-Methylation by Ribomethseq.” Edited by Narendra Wajapeyee and Romi Gupta. New York, NY: Springer New York, 273–95. https://doi.org/10.1007/978-1-4939-8808-2_21.
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.
Marchand, Virginie, Lilia Ayadi, Aseel El Hajj, Florence Blanloeil-Oillo, Mark Helm, and Yuri Motorin. 2017. “High-Throughput Mapping of 2’-O-Me Residues in Rna Using Next-Generation Sequencing (Illumina Ribomethseq Protocol).” Methods in Molecular Biology (Clifton, N.J.) 1562:171–87. https://doi.org/10.1007/978-1-4939-6807-7_12.