DESeq2 namespace load failed for GenomeInfoDb
1
0
Entering edit mode
Brian Smith ▴ 120
@brian-smith-6197
Last seen 3.6 years ago
United States

I am trying to install DESeq2. It seems to install ok, but crashes out when I try to load it with "library(DESeq2)" command. Here are my commands and sessionInfo():

> BiocManager::install("DESeq2")

Bioconductor version 3.10 (BiocManager 1.30.10), R 3.6.2 (2019-12-12)
Installing package(s) 'DESeq2'
trying URL 'https://bioconductor.org/packages/3.10/bioc/bin/macosx/el-capitan/contrib/3.6/DESeq2_1.26.0.tgz'
Content type 'application/x-gzip' length 4052218 bytes (3.9 MB)
==================================================
downloaded 3.9 MB


The downloaded binary packages are in
    /var/folders/gh/2d3ryrbn071_thmpcb_86w_w0000gn/T//RtmpwyYBDn/downloaded_packages

> library(DESeq2)
Loading required package: S4Vectors
Loading required package: stats4
Loading required package: BiocGenerics
Loading required package: parallel

Attaching package: ‘BiocGenerics’

The following objects are masked from ‘package:parallel’:

    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ, clusterExport, clusterMap, parApply,
    parCapply, parLapply, parLapplyLB, parRapply, parSapply, parSapplyLB

The following objects are masked from ‘package:stats’:

    IQR, mad, sd, var, xtabs

The following objects are masked from ‘package:base’:

    anyDuplicated, append, as.data.frame, basename, cbind, colnames, dirname, do.call, duplicated,
    eval, evalq, Filter, Find, get, grep, grepl, intersect, is.unsorted, lapply, Map, mapply,
    match, mget, order, paste, pmax, pmax.int, pmin, pmin.int, Position, rank, rbind, Reduce,
    rownames, sapply, setdiff, sort, table, tapply, union, unique, unsplit, which, which.max,
    which.min


Attaching package: ‘S4Vectors’

The following object is masked from ‘package:base’:

    expand.grid

Loading required package: IRanges
Loading required package: GenomicRanges
Loading required package: GenomeInfoDb

Error: package or namespace load failed for ‘GenomeInfoDb’ in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]):
 there is no package called ‘GenomeInfoDbData’

Error: package ‘GenomeInfoDb’ could not be loaded

*> BiocManager::install("GenomeInfoDb")
Bioconductor version 3.10 (BiocManager 1.30.10), R 3.6.2 (2019-12-12)
Installing package(s) 'GenomeInfoDb'
also installing the dependency ‘GenomeInfoDbData’
trying URL 'https://bioconductor.org/packages/3.10/bioc/bin/macosx/el-capitan/contrib/3.6/GenomeInfoDb_1.22.0.tgz'
Content type 'application/x-gzip' length 3794448 bytes (3.6 MB)
==================================================
downloaded 3.6 MB
The downloaded binary packages are in
    /var/folders/gh/2d3ryrbn071_thmpcb_86w_w0000gn/T//RtmpwyYBDn/downloaded_packages
installing the source package ‘GenomeInfoDbData’
trying URL 'https://bioconductor.org/packages/3.10/data/annotation/src/contrib/GenomeInfoDbData_1.2.2.tar.gz'
Content type 'application/x-gzip' length 10194482 bytes (9.7 MB)
==================================================
downloaded 9.7 MB
Error in library(BiocInstaller) : 
  there is no package called ‘BiocInstaller’
Execution halted
The downloaded source packages are in
    ‘/private/var/folders/gh/2d3ryrbn071_thmpcb_86w_w0000gn/T/RtmpwyYBDn/downloaded_packages’
Warning message:
In install.packages(...) :
  installation of package ‘GenomeInfoDbData’ had non-zero exit status
> BiocManager::install("BiocInstaller")
Bioconductor version 3.10 (BiocManager 1.30.10), R 3.6.2 (2019-12-12)
Installing package(s) 'BiocInstaller'
Warning message:
package ‘BiocInstaller’ is not available (for R version 3.6.2)* 



> sessionInfo()
R version 3.6.2 (2019-12-12)
Platform: x86_64-apple-darwin15.6.0 (64-bit)
Running under: macOS High Sierra 10.13.6

Matrix products: default
BLAS:   /System/Library/Frameworks/Accelerate.framework/Versions/A/Frameworks/vecLib.framework/Versions/A/libBLAS.dylib
LAPACK: /Library/Frameworks/R.framework/Versions/3.6/Resources/lib/libRlapack.dylib

locale:
[1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

attached base packages:
[1] parallel  stats4    stats     graphics  grDevices utils     datasets  methods   base     

other attached packages:
[1] IRanges_2.20.1      S4Vectors_0.24.1    BiocGenerics_0.32.0

loaded via a namespace (and not attached):
[1] BiocManager_1.30.10 compiler_3.6.2      tools_3.6.2         RCurl_1.95-4.12     bitops_1.0-6 
DESeq2 • 1.9k views
ADD COMMENT
1
Entering edit mode
@mikelove
Last seen 1 day ago
United States

Install the missing package and try again.

ADD COMMENT
0
Entering edit mode

Nope, didn't work (I have edited the main post, i.e. added attempt to install 'GenomeInfoDb')

ADD REPLY
0
Entering edit mode

The mystery is where the need to install 'BiocInstaller' comes from. Make sure that you are using a 'vanilla' version of R (no .Rprofile loaded, e.g., by using a terminal and launching R --vanilla). Try BiocManager::install("GenomeInfoDbData"). Check also BiocManager::valid(). If that fails, I suspect that you have multiple installations of GenomeInfoDbData (and perhaps other packages); you could look at .libPaths() and installed.packages() to find out, e.g.,

> pkgs = installed.packages()
> tbl = table(rownames(pkgs))
> tbl[tbl > 1]
named integer(0)

and then remove all copies of duplicated packages (some are perhaps installed by an 'administrator'; the right think to do, on a personal work station, is NOT to install packages as administrator) and re-install using BiocManager::install()

ADD REPLY
0
Entering edit mode

So, I did the following:

  1. Removed the .Rprofile file
  2. Opened R in terminal with R --vanilla command
  3. Checked for duplicated packages (there weren't any).
  4. Tried to install again, but this time (eventually) got a compiler error...
| => R --vanilla

R version 3.6.2 (2019-12-12) -- "Dark and Stormy Night"
.
.

'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.

> BiocManager::valid()
[1] TRUE
>

> BiocManager::install("GenomeInfoDbData")
Bioconductor version 3.10 (BiocManager 1.30.10), R 3.6.2 (2019-12-12)
Installing package(s) 'GenomeInfoDbData'
installing the source package ‘GenomeInfoDbData’

trying URL 'https://bioconductor.org/packages/3.10/data/annotation/src/contrib/GenomeInfoDbData_1.2.2.tar.gz'
Content type 'application/x-gzip' length 10194482 bytes (9.7 MB)
==================================================
downloaded 9.7 MB

* installing *source* package ‘GenomeInfoDbData’ ...
** using staged installation
** data
.
.
** testing if installed package keeps a record of temporary installation path
* DONE (GenomeInfoDbData)

The downloaded source packages are in
    ‘/private/var/folders/gh/2d3ryrbn071_thmpcb_86w_w0000gn/T/RtmpQm55AK/downloaded_packages’
> pkgs = installed.packages()
> tbl = table(rownames(pkgs))
> tbl[tbl > 1]
named integer(0)


> BiocManager::install("DESeq2")
Bioconductor version 3.10 (BiocManager 1.30.10), R 3.6.2 (2019-12-12)
Installing package(s) 'DESeq2'
trying URL 'https://bioconductor.org/packages/3.10/bioc/bin/macosx/el-capitan/contrib/3.6/DESeq2_1.26.0.tgz'
Content type 'application/x-gzip' length 4052218 bytes (3.9 MB)
==================================================
downloaded 3.9 MB


The downloaded binary packages are in
    /var/folders/gh/2d3ryrbn071_thmpcb_86w_w0000gn/T//RtmpQm55AK/downloaded_packages
>

> library(DESeq2)
.
.
The following objects are masked from ‘package:base’:

    aperm, apply, rowsum

Error: package or namespace load failed for ‘DESeq2’ in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]):
 there is no package called ‘stringi’


> BiocManager::install("stringi")
.
.
.
checking for local ICUDT_DIR... icu61/data
checking for gcc... clang
checking whether the C compiler works... no
configure: error: in `/private/var/folders/gh/2d3ryrbn071_thmpcb_86w_w0000gn/T/RtmpgbIyT2/R.INSTALLd8b03ee0eaab/stringi':
configure: error: C compiler cannot create executables
See `config.log' for more details
ERROR: configuration failed for package ‘stringi’
* removing ‘/Library/Frameworks/R.framework/Versions/3.6/Resources/library/stringi’
* restoring previous ‘/Library/Frameworks/R.framework/Versions/3.6/Resources/library/stringi’

The downloaded source packages are in
    ‘/private/var/folders/gh/2d3ryrbn071_thmpcb_86w_w0000gn/T/RtmpQm55AK/downloaded_packages’
Warning message:
In install.packages(update[instlib == l, "Package"], l, repos = repos,  :
  installation of package ‘stringi’ had non-zero exit status

> sessionInfo()

R version 3.6.2 (2019-12-12)
Platform: x86_64-apple-darwin15.6.0 (64-bit)
Running under: macOS High Sierra 10.13.6

Matrix products: default
BLAS:   /Library/Frameworks/R.framework/Versions/3.6/Resources/lib/libRblas.0.dylib
LAPACK: /Library/Frameworks/R.framework/Versions/3.6/Resources/lib/libRlapack.dylib

locale:
[1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

attached base packages:
[1] parallel  stats4    stats     graphics  grDevices utils     datasets
[8] methods   base

other attached packages:
 [1] SummarizedExperiment_1.16.1 DelayedArray_0.12.2
 [3] BiocParallel_1.20.1         matrixStats_0.55.0
 [5] Biobase_2.46.0              GenomicRanges_1.38.0
 [7] GenomeInfoDb_1.22.0         IRanges_2.20.1
 [9] S4Vectors_0.24.1            BiocGenerics_0.32.0

loaded via a namespace (and not attached):
 [1] xfun_0.11              splines_3.6.2          lattice_0.20-38
 [4] colorspace_1.4-1       htmltools_0.4.0        base64enc_0.1-3
 [7] survival_3.1-8         rlang_0.4.2            pillar_1.4.3
[10] foreign_0.8-74         RColorBrewer_1.1-2     jpeg_0.1-8.1
[13] GenomeInfoDbData_1.2.2 lifecycle_0.1.0        zlibbioc_1.32.0
[16] munsell_0.5.0          gtable_0.3.0           htmlwidgets_1.5.1
[19] latticeExtra_0.6-29    knitr_1.26             Rcpp_1.0.3
[22] acepack_1.4.1          scales_1.1.0           backports_1.1.5
[25] checkmate_1.9.4        BiocManager_1.30.10    XVector_0.26.0
[28] gridExtra_2.3          ggplot2_3.2.1          png_0.1-7
[31] digest_0.6.23          grid_3.6.2             tools_3.6.2
[34] bitops_1.0-6           magrittr_1.5           lazyeval_0.2.2
[37] RCurl_1.95-4.12        tibble_2.1.3           Formula_1.2-3
[40] cluster_2.1.0          crayon_1.3.4           pkgconfig_2.0.3
[43] Matrix_1.2-18          rstudioapi_0.10        R6_2.4.1
ADD REPLY
0
Entering edit mode

So we're making progress? If this were an installation of R from CRAN, then it would be installing binaries on macOS, rather than source, and it would not need to find a clang able to build binaries. My guess is that you're using something else, maybe bioconda, and if the later that you should restrict yourself to using conda-based installation practices (rather than mixing conda and Bioconductor practices; actually my recommendation would be to stick with Bioconductor practices...)

ADD REPLY
0
Entering edit mode

The compiler error may be due to reliance on apple's clang. see https://cran.r-project.org/bin/macosx/tools/ for a version of the compiler that might be better -- although I cannot vouch for this if indeed you are mixing conda and Bioc installation practices.

ADD REPLY
0
Entering edit mode

Thanks, that helped to figure out the problem! I installed a fresh version of the compiler and re-installed R.

ADD REPLY

Login before adding your answer.

Traffic: 457 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6