Contents

The scanMiRData package contains KdModel collections corresponding to all human, mouse and rat mirbase miRNAs. These represent the miRNA binding affinities (or more exactly, dissociation rates) predicted using the CNN from McGeary, Lin et al. (2019). To know more about the KdModel and KdModelList classes, see the corresponding vignette in the scanMiR package.

1 Loading the collections

The objects can be loaded to the environment using data:

library(scanMiR)
data("mmu", package="scanMiRData")
summary(mmu)
## A `KdModelList` object created on 2020-11-22,
##  containing binding affinity models from 1978 miRNAs.
## Mus musculus, miRBase release 22.1
## 
##               Low-confidence             Poorly conserved 
##                         1215                          346 
##     Conserved across mammals Conserved across vertebrates 
##                          134                          203 
##                         <NA> 
##                           80
head(mmu)
## An object of class "KdModelList"
## [[1]]
## A `KdModel` for mmu-let-7a-1-3p (Low-confidence)
##   Sequence: CUAUACAAUCUACUGUCUUUCC
##   Canonical target seed: TTGTATA(A)
## [[2]]
## A `KdModel` for mmu-let-7a-2-3p (Low-confidence)
##   Sequence: CUGUACAGCCUCCUAGCUUUC
##   Canonical target seed: CTGTACA(A)
## [[3]]
## A `KdModel` for mmu-let-7a-5p (Conserved across vertebrates)
##   Sequence: UGAGGUAGUAGGUUGUAUAGUU
##   Canonical target seed: CTACCTC(A)
## [[4]]
## A `KdModel` for mmu-let-7b-3p (Low-confidence)
##   Sequence: CUAUACAACCUACUGCCUUCCC
##   Canonical target seed: TTGTATA(A)
## [[5]]
## A `KdModel` for mmu-let-7b-5p (Conserved across vertebrates)
##   Sequence: UGAGGUAGUAGGUUGUGUGGUU
##   Canonical target seed: CTACCTC(A)
## [[6]]
## A `KdModel` for mmu-let-7c-1-3p (Low-confidence)
##   Sequence: CUGUACAACCUUCUAGCUUUCC
##   Canonical target seed: TTGTACA(A)

Alternatively, they can also be loaded (and filtered) through a convenient function:

library(scanMiRData)
mmu <- getKdModels("mmu", categories=c("Conserved across vertebrates", 
                                       "Conserved across mammals"))
summary(mmu)
## A `KdModelList` object containing binding affinity models from 337 miRNAs.
## 
##               Low-confidence             Poorly conserved 
##                            0                            0 
##     Conserved across mammals Conserved across vertebrates 
##                          134                          203

Summary of the other two collections:

summary(getKdModels("hsa"))
## A `KdModelList` object containing binding affinity models from 2656 miRNAs.
## 
##               Low-confidence             Poorly conserved 
##                         1913                          290 
##     Conserved across mammals Conserved across vertebrates 
##                          136                          192 
##                         <NA> 
##                          125
summary(getKdModels("rno"))
## A `KdModelList` object containing binding affinity models from 764 miRNAs.
## 
##               Low-confidence             Poorly conserved 
##                          482                            2 
##     Conserved across mammals Conserved across vertebrates 
##                          112                          165 
##                         <NA> 
##                            3



Session info

## R version 4.3.1 (2023-06-16)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.18-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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] scanMiRData_1.8.0 scanMiR_1.8.0     BiocStyle_2.30.0 
## 
## loaded via a namespace (and not attached):
##  [1] sass_0.4.7              utf8_1.2.4              generics_0.1.3         
##  [4] bitops_1.0-7            stringi_1.7.12          digest_0.6.33          
##  [7] magrittr_2.0.3          evaluate_0.22           grid_4.3.1             
## [10] bookdown_0.36           fastmap_1.1.1           jsonlite_1.8.7         
## [13] GenomeInfoDb_1.38.0     BiocManager_1.30.22     fansi_1.0.5            
## [16] scales_1.2.1            Biostrings_2.70.1       codetools_0.2-19       
## [19] jquerylib_0.1.4         cli_3.6.1               rlang_1.1.1            
## [22] crayon_1.5.2            XVector_0.42.0          cowplot_1.1.1          
## [25] munsell_0.5.0           cachem_1.0.8            yaml_2.3.7             
## [28] tools_4.3.1             ggseqlogo_0.1           parallel_4.3.1         
## [31] BiocParallel_1.36.0     dplyr_1.1.3             colorspace_2.1-0       
## [34] ggplot2_3.4.4           GenomeInfoDbData_1.2.11 BiocGenerics_0.48.0    
## [37] vctrs_0.6.4             R6_2.5.1                stats4_4.3.1           
## [40] lifecycle_1.0.3         zlibbioc_1.48.0         S4Vectors_0.40.0       
## [43] IRanges_2.36.0          pkgconfig_2.0.3         bslib_0.5.1            
## [46] pillar_1.9.0            gtable_0.3.4            glue_1.6.2             
## [49] data.table_1.14.8       xfun_0.40               tibble_3.2.1           
## [52] GenomicRanges_1.54.0    tidyselect_1.2.0        knitr_1.44             
## [55] htmltools_0.5.6.1       rmarkdown_2.25          compiler_4.3.1         
## [58] RCurl_1.98-1.12