Entering edit mode
ben.ponv
•
0
@benponv-24079
Last seen 3.9 years ago
I tried to download the methylation data from AnnotationHub using these lines of code:
library(AnnotationHub)
library(IRanges)
library(GenomicRanges)
ahub = AnnotationHub()
ahub = subset(ahub, species =="Homo sapiens")
quehist1 = query(ahub,c("H3K4me3","E003"))
H3K4me3_H1 = quehist1[['AH29884']]
ahub
and quehist1
appears to be normal, but there's an error when I try to download the data (the H3K4me3_H1 = quehist1[['AH29884']]
line).
The error printed was:
Error: failed to load resource name: AH29884 title: E003-H3K4me3.narrowPeak.gz reason: 1 resources failed to download
9.stop("failed to load resource", "\n name: ", names(x), "\n title: ", x$title, "\n reason: ", conditionMessage(err), call. = FALSE)
8.value[[3L]](cond)
7.tryCatchOne(expr, names, parentenv, handlers[[1L]])
6.tryCatchList(expr, classes, parentenv, handlers)
5.tryCatch({ fls <- cache(getHub(class), force = force, verbose = verbose) .get1(class) }, error = function(err) { ...
4..Hub_get1(x[idx], force = force, verbose = verbose)
3..local(x, i, j = j, ...)
2.quehist1[["AH29884"]]
1.quehist1[["AH29884"]]
What should I do to be able to get the data name AH29884? I'm using R 4.0.2, Bioconductor v.3.11, AnnotationHub 2.20.2.
Thank you for bringing this to our attention. The server where the data was hosted is currently not active. We are investigate weather the data moved locations permanently or if this is only temporary downtime. We will post again when we have more information.
Thank you for your information. For an update, the server seems to be active now and I can download the data without problem.
Thank you! Glad it is back up and running. Sorry for the inconvenience