Packages not working with R 4.0
1
0
Entering edit mode
nanderson • 0
@nanderson-23474
Last seen 3.1 years ago
United States

Trying to re-install packages in R version 4.0 following Bioconductor site instructions to install in R version 4.0, however receiving this warning from R each time i try to re-install the packages R asks me to re-install.

Error: Bioconductor version '3.10' requires R version '3.6'; see
  https://bioconductor.org/install

 sessionInfo()
R version 4.0.0 (2020-04-24)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows 10 x64 (build 17763)

Matrix products: default

locale:
[1] LC_COLLATE=English_United States.1252 
[2] LC_CTYPE=English_United States.1252   
[3] LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C                          
[5] LC_TIME=English_United States.1252    

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

loaded via a namespace (and not attached):
[1] BiocManager_1.30.10 compiler_4.0.0      tools_4.0.0        
>
software error • 2.1k views
ADD COMMENT
1
Entering edit mode
Kevin Blighe ★ 4.0k
@kevin
Last seen 4 weeks ago
Republic of Ireland

Hi, it seems that you are already running R v4.0.0.

To install Bioconductor v3.11 packages, please try:

BiocManager::install(version = '3.11')

You may require Administrator / sudo privileges, depending on how your system is setup.

Kevin

ADD COMMENT
0
Entering edit mode

Hello, I am having an error with running the command newCountDataSet() using DESeq2. Not sure if this also has to do with R 4.0? Thanks. Cheers

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 Loading required package: SummarizedExperiment Loading required package: Biobase Welcome to Bioconductor

Vignettes contain introductory material; view with 'browseVignettes()'. To cite
Bioconductor, see 'citation("Biobase")', and for packages 'citation("pkgname")'.

Loading required package: DelayedArray Loading required package: matrixStats

Attaching package: ‘matrixStats’

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

anyMissing, rowMedians

Attaching package: ‘DelayedArray’

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

colMaxs, colMins, colRanges, rowMaxs, rowMins, rowRanges

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

aperm, apply, rowsum

BiocManager::version() [1] ‘3.11’ package.version("DESeq2") [1] "1.28.0"

host <- read.csv("GenesPastOAojo.csv", header=TRUE, row.names=1) meta <- read.csv("PastreoidesYear-2metadata.csv", header=TRUE, row.names=1)

host.counts <- newCountDataSet(host, meta) Error in newCountDataSet(host, meta) : could not find function "newCountDataSet"

sessionInfo() R version 4.0.0 (2020-04-24) Platform: x86_64-apple-darwin17.0 (64-bit) Running under: macOS High Sierra 10.13.4

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

Random number generation: RNG: Mersenne-Twister Normal: Inversion Sample: Rounding

locale: [1] enAU.UTF-8/enAU.UTF-8/enAU.UTF-8/C/enAU.UTF-8/en_AU.UTF-8

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

other attached packages: [1] DESeq21.28.0 SummarizedExperiment1.18.1 DelayedArray0.14.0
[4] matrixStats
0.56.0 Biobase2.48.0 GenomicRanges1.40.0
[7] GenomeInfoDb1.24.0 IRanges2.22.1 S4Vectors0.26.0
[10] BiocGenerics
0.34.0

loaded via a namespace (and not attached): [1] genefilter1.70.0 locfit1.5-9.4 xfun0.13 splines4.0.0
[5] lattice0.20-41 colorspace1.4-1 vctrs0.2.4 blob1.2.1
[9] survival3.1-12 XML3.99-0.3 rlang0.4.6 pillar1.4.4
[13] glue1.4.0 DBI1.1.0 BiocParallel1.22.0 bit640.9-7
[17] RColorBrewer1.1-2 GenomeInfoDbData1.2.3 lifecycle0.2.0 zlibbioc1.34.0
[21] munsell0.5.0 gtable0.3.0 memoise1.1.0 knitr1.28
[25] geneplotter1.66.0 AnnotationDbi1.50.0 Rcpp1.0.4.6 xtable1.8-4
[29] scales1.1.0 BiocManager1.30.10 annotate1.66.0 XVector0.28.0
[33] bit1.1-15.2 ggplot23.3.0 digest0.6.25 grid4.0.0
[37] tools4.0.0 bitops1.0-6 magrittr1.5 RCurl1.98-1.2
[41] RSQLite2.2.0 tibble3.0.1 crayon1.3.4 pkgconfig2.0.3
[45] ellipsis0.3.0 Matrix1.2-18 rstudioapi0.11 R62.4.1
[49] compiler_4.0.0

ADD REPLY
1
Entering edit mode

AFAIK the newCountDataSet() function belongs to DESeq, not DESeq2.

ADD REPLY
0
Entering edit mode

Ah right, thank you for pointing that out. Trying to learn from a script that shows loading the DESeq2 library but then apparently may be showing DESeq functions. Cheers

ADD REPLY

Login before adding your answer.

Traffic: 751 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