Contents


The Herper package is a simple toolset to install and manage Conda packages and environments from R.

The Herper package was developed by Matt Paul, Doug Barrows and Thomas Carroll at the Rockefeller University Bioinformatics Resources Center with contributions from Kathryn Rozen-Gagnon.


0.1 Installation

Use the BiocManager package to download and install the package from our Github repository:

if (!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")
BiocManager::install("Herper")

Once installed, load it into your R session:

library(Herper)

0.2 Install Conda packages with install_CondaTools.

The install_CondaTools() function allows the user to specify required Conda software and the desired environment to install into.

Miniconda is installed as part of the process (by default into the r-reticulate’s default Conda location). If you already have Miniconda installed (or want to control the location of miniconda installation), you can specify the path with the pathToMiniConda parameter.

myMiniconda <- file.path(tempdir(),"Test")
install_CondaTools("salmon==1.3.0", "herper", pathToMiniConda = myMiniconda)

0.3 Install R package dependencies with install_CondaSysReqs.

The install_CondaSysReqs checks the System Requirements for the specified R package, and uses Conda to install this software.

testPkg <- system.file("extdata/HerperTestPkg",package="Herper")
install.packages(testPkg,type = "source",repos = NULL)
condaDir <- file.path(tempdir(),"r-miniconda")
condaPaths <- install_CondaSysReqs("HerperTestPkg",pathToMiniConda=condaDir,SysReqsAsJSON=FALSE)
#' system2(file.path(condaPaths$pathToEnvBin,"samtools"),args = "--help")

0.4 Acknowledgements

Thank you to Ji-Dung Luo and Wei Wang for testing/vignette review/critical feedback and Ziwei Liang for their support.

0.5 Session Information

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               LC_TIME=en_US.UTF-8       
##  [4] LC_COLLATE=C               LC_MONETARY=en_US.UTF-8    LC_MESSAGES=en_US.UTF-8   
##  [7] LC_PAPER=en_US.UTF-8       LC_NAME=C                  LC_ADDRESS=C              
## [10] LC_TELEPHONE=C             LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C       
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
##  [1] seqCNA_1.36.0       seqCNA.annot_1.26.0 adehabitatLT_0.3.25 CircStats_0.2-6    
##  [5] boot_1.3-27         MASS_7.3-53.1       adehabitatMA_0.3.14 ade4_1.7-16        
##  [9] sp_1.4-5            doSNOW_1.0.19       snow_0.4-3          iterators_1.0.13   
## [13] foreach_1.5.1       GLAD_2.54.0         Herper_1.0.2        reticulate_1.18    
## [17] BiocStyle_2.18.1   
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_1.0.6          bslib_0.2.4         compiler_4.0.4      BiocManager_1.30.10
##  [5] jquerylib_0.1.3     highr_0.8           prettyunits_1.1.1   progress_1.2.2     
##  [9] tools_4.0.4         digest_0.6.27       lifecycle_1.0.0     jsonlite_1.7.2     
## [13] evaluate_0.14       lattice_0.20-41     pkgconfig_2.0.3     rlang_0.4.10       
## [17] Matrix_1.3-2        yaml_2.2.1          parallel_4.0.4      xfun_0.21          
## [21] withr_2.4.1         stringr_1.4.0       knitr_1.31          vctrs_0.3.6        
## [25] hms_1.0.0           sass_0.3.1          rappdirs_0.3.3      grid_4.0.4         
## [29] R6_2.5.0            rmarkdown_2.7       bookdown_0.21       magrittr_2.0.1     
## [33] ellipsis_0.3.1      codetools_0.2-18    htmltools_0.5.1.1   stringi_1.5.3      
## [37] crayon_1.4.1        rjson_0.2.20