This R package provides methods for genetic finemapping in inbred mice by taking advantage of their very high homozygosity rate (>95%).
Method prio allows to select strain combinations which best refine a specified genetic region. E.g. if a crossing experiment with two inbred mouse strains ‘strain1’ and ‘strain2’ resulted in a QTL, the outputted strain combinations can be used to refine the respective region in further crossing experiments and to select candidate genes.
if(!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")
BiocManager::install("MouseFM")library(MouseFM)Available mouse strains
avail_strains()
#>              id        strain
#> 1  129P2_OlaHsd  129P2/OlaHsd
#> 2   129S1_SvImJ   129S1/SvImJ
#> 3  129S5SvEvBrd 129S5/SvEvBrd
#> 4           A_J           A/J
#> 5         AKR_J         AKR/J
#> 6       BALB_cJ       BALB/cJ
#> 7          BTBR          BTBR
#> 8       BUB_BnJ       BUB/BnJ
#> 9       C3H_HeH       C3H/HeH
#> 10      C3H_HeJ       C3H/HeJ
#> 11    C57BL_10J     C57BL/10J
#> 12     C57BL_6J      C57BL/6J
#> 13    C57BL_6NJ     C57BL/6NJ
#> 14    C57BR_cdJ     C57BR/cdJ
#> 15       C57L_J        C57L/J
#> 16        C58_J         C58/J
#> 17     CAST_EiJ      CAST/EiJ
#> 18        CBA_J         CBA/J
#> 19       DBA_1J        DBA/1J
#> 20       DBA_2J        DBA/2J
#> 21       FVB_NJ        FVB/NJ
#> 22        I_LnJ         I/LnJ
#> 23       KK_HiJ        KK/HiJ
#> 24    LEWES_EiJ     LEWES/EiJ
#> 25         LP_J          LP/J
#> 26     MOLF_EiJ      MOLF/EiJ
#> 27   NOD_ShiLtJ    NOD/ShiLtJ
#> 28     NZB_B1NJ      NZB/B1NJ
#> 29    NZO_HlLtJ     NZO/HlLtJ
#> 30     NZW_LacJ      NZW/LacJ
#> 31      PWK_PhJ       PWK/PhJ
#> 32         RF_J          RF/J
#> 33      SEA_GnJ       SEA/GnJ
#> 34    SPRET_EiJ     SPRET/EiJ
#> 35        ST_bJ         ST/bJ
#> 36      WSB_EiJ       WSB/EiJ
#> 37  ZALENDE_EiJ   ZALENDE/EiJPrioritize additional mouse strains for a given region which was identified in a crossing experiment with strain1 C57BL_6J and strain2 AKR_J.
df = prio("chr1", start=5000000, end=6000000, strain1="C57BL_6J", strain2="AKR_J")
#> Query chr1:5,000,000-6,000,000
#> Calculate reduction factors...
#> Set size 1: 35 combinations
#> Set size 1: continue with 20 of 35 strains
#> Set size 2: 190 combinations
#> Set size 3: 1,140 combinationsView meta information
comment(df)
#> NULLExtract the combinations with the best refinement
get_top(df$reduction, n_top=3)
#>    strain1 strain2              combination      mean       min       max n
#> 8 C57BL_6J   AKR_J C3H_HeH,DBA_1J,SPRET_EiJ 0.8068057 0.7467057 0.9926794 3
#> 7 C57BL_6J   AKR_J C3H_HeH,DBA_2J,SPRET_EiJ 0.8068057 0.7467057 0.9926794 3
#> 6 C57BL_6J   AKR_J C3H_HeJ,DBA_1J,SPRET_EiJ 0.8068057 0.7467057 0.9926794 3Create plots
plots = vis_reduction_factors(df$genotypes, df$reduction, 2)
plots[[1]]plots[[2]]The output of sessionInfo() on the system
on which this document was compiled:
sessionInfo()
#> R version 4.2.1 (2022-06-23)
#> Platform: x86_64-pc-linux-gnu (64-bit)
#> Running under: Ubuntu 20.04.5 LTS
#> 
#> Matrix products: default
#> BLAS:   /home/biocbuild/bbs-3.16-bioc/R/lib/libRblas.so
#> LAPACK: /home/biocbuild/bbs-3.16-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] stats     graphics  grDevices utils     datasets  methods   base     
#> 
#> other attached packages:
#> [1] MouseFM_1.8.0    BiocStyle_2.26.0
#> 
#> loaded via a namespace (and not attached):
#>  [1] Biobase_2.58.0         httr_1.4.4             tidyr_1.2.1           
#>  [4] sass_0.4.2             bit64_4.0.5            jsonlite_1.8.3        
#>  [7] gtools_3.9.3           bslib_0.4.0            assertthat_0.2.1      
#> [10] highr_0.9              BiocManager_1.30.19    stats4_4.2.1          
#> [13] BiocFileCache_2.6.0    blob_1.2.3             GenomeInfoDbData_1.2.9
#> [16] yaml_2.3.6             progress_1.2.2         pillar_1.8.1          
#> [19] RSQLite_2.2.18         rlist_0.4.6.2          glue_1.6.2            
#> [22] digest_0.6.30          GenomicRanges_1.50.0   XVector_0.38.0        
#> [25] colorspace_2.0-3       plyr_1.8.7             htmltools_0.5.3       
#> [28] XML_3.99-0.12          pkgconfig_2.0.3        biomaRt_2.54.0        
#> [31] magick_2.7.3           bookdown_0.29          zlibbioc_1.44.0       
#> [34] purrr_0.3.5            scales_1.2.1           tibble_3.1.8          
#> [37] KEGGREST_1.38.0        farver_2.1.1           generics_0.1.3        
#> [40] IRanges_2.32.0         ggplot2_3.3.6          ellipsis_0.3.2        
#> [43] cachem_1.0.6           BiocGenerics_0.44.0    cli_3.4.1             
#> [46] magrittr_2.0.3         crayon_1.5.2           memoise_2.0.1         
#> [49] evaluate_0.17          fansi_1.0.3            xml2_1.3.3            
#> [52] tools_4.2.1            data.table_1.14.4      prettyunits_1.1.1     
#> [55] hms_1.1.2              lifecycle_1.0.3        stringr_1.4.1         
#> [58] S4Vectors_0.36.0       munsell_0.5.0          AnnotationDbi_1.60.0  
#> [61] Biostrings_2.66.0      compiler_4.2.1         jquerylib_0.1.4       
#> [64] GenomeInfoDb_1.34.0    rlang_1.0.6            grid_4.2.1            
#> [67] RCurl_1.98-1.9         rappdirs_0.3.3         bitops_1.0-7          
#> [70] rmarkdown_2.17         gtable_0.3.1           DBI_1.1.3             
#> [73] curl_4.3.3             reshape2_1.4.4         R6_2.5.1              
#> [76] knitr_1.40             dplyr_1.0.10           fastmap_1.1.0         
#> [79] bit_4.0.4              utf8_1.2.2             filelock_1.0.2        
#> [82] stringi_1.7.8          Rcpp_1.0.9             vctrs_0.5.0           
#> [85] png_0.1-7              dbplyr_2.2.1           tidyselect_1.2.0      
#> [88] xfun_0.34