Entering edit mode
Hello,
I would like to have repeat sequences as GRanges object
I started with ...
library (BSgenome.Hsapiens.UCSC.hg19)
ch1 <- Hsapiens$chr1
active (masks (ch1))
AGAPS AMB RM TRF
TRUE TRUE FALSE FALSE
active (masks(ch1))["RM"] <- TRUE
active (masks (ch1))
AGAPS AMB RM TRF
TRUE TRUE TRUE FALSE
Can anyboldy give me a hint how to continue.
Thanks
hermann
[[alternative HTML version deleted]]

In the time since this helpful reply was written, is there a more AnnotationHub-way to do this? That is, in the third line of the below code chunk, is there a way to specify which additional columns are added as
mcolstorepeats?library(AnnotationHub) ah <- AnnotationHub() repeats <- query(ah, c("mm10", "RepeatMasker"))[[1L]]