AnnotationHub instaltion probelm !
1
0
Entering edit mode
baa8775 • 0
@baa8775-15966
Last seen 5.9 years ago

I have tried to load AnnotationHub to 2 machine (windows 10 and Mac ox ) both attempts failed miserably 

tried different commands+ updated R & R Studio to latest versions ! nothing helped, it seemed it does installed it but i can load it due some other packages getting in the way! masked object ! packages not avoid;avle in compiled versions etc ,  in widows it give me the same error message but the package name  at the end of the error messge called shiny , in mac it is called bit 

also  loadNamespace  consistence on both platform,  I haven't used R in a while so I thought the update will solve the problem ! but it didn't 

this is from my Max machine

> BiocInstaller::biocValid()
[1] TRUE

> library(AnnotationHub)
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, colMeans, colnames, colSums,
    dirname, do.call, duplicated, eval, evalq, Filter, Find, get, grep, grepl, intersect,
    is.unsorted, lapply, lengths, Map, mapply, match, mget, order, paste, pmax, pmax.int,
    pmin, pmin.int, Position, rank, rbind, Reduce, rowMeans, rownames, rowSums, sapply,
    setdiff, sort, table, tapply, union, unique, unsplit, which, which.max, which.min

Error: package or namespace load failed for ‘AnnotationHub’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
 there is no package called ‘bit’


> library(AnnotationHub)

Error: package or namespace load failed for ‘AnnotationHub’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):

 there is no package called ‘bit’

 

annotation • 595 views
ADD COMMENT
0
Entering edit mode
@martin-morgan-1513
Last seen 5 days ago
United States

Try installing 'bit' first

biocLite("bit")
biocLite("AnnotationHub")
ADD COMMENT

Login before adding your answer.

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