Getting error while running GenomicPlot
0
0
Entering edit mode
Lucky • 0
@lucky-24920
Last seen 8 weeks ago
India

Hello,

I am trying use your tool for mouse MeRIP data while running end up with error can you please help me to resolve the issue below is the script and error

Thank you

library(rtracklayer)
library(BiocParallel)
library(GenomicPlot)


gtf_file <- "Mus_musculus.GRCm39.104.gtf"
txdb <- custom_TxDb_from_GTF(gtf_file, genome = "mm39")

gf <- prepare_5parts_genomic_features(txdb,
                                      meta = TRUE, nbins = 100, fiveP = -0, threeP = 0,
                                      longest = TRUE
)

queryfiles <- c("IP_Aligned.sortedByCoord.out.bam")
names(queryfiles) <- c("IP_bam")
inputfiles <- c("Input_Aligned.sortedByCoord.out.bam")
names(inputfiles) <- c("Input")


bamimportParams <- setImportParams(
  offset = -1, fix_width = 0, fix_point = "start", norm = TRUE,
  useScore = FALSE, outRle = TRUE, useSizeFactor = FALSE, genome = "mm39"
)

plot_5parts_metagene(
  queryFiles = queryfiles,
  gFeatures_list = list(gf),
  inputFiles = inputfiles,
  scale = FALSE,
  verbose = FALSE,
  transform = NA,
  smooth = TRUE,
  stranded = TRUE,
  outPrefix = NULL,
  importParams = bamimportParams,
  heatmap = TRUE,
  rmOutlier = 0,
  nc = 2
)

##error what I got 
[set_seqinfo]
[set_seqinfo]
Error in as.vector(x, "character") : 
  cannot coerce type 'closure' to vector of type 'character'
In addition: Warning messages:
1: In valid.GenomicRanges.seqinfo(x, suggest.trim = TRUE) :
  GRanges object contains 1 out-of-bound range located on sequence MT. Note that ranges located on a
  sequence whose length is unknown (NA) or on a circular sequence are not considered out-of-bound (use
  seqlengths() and isCircular() to get the lengths and circularity flags of the underlying sequences).
  You can use trim() to trim these ranges. See ?`trim,GenomicRanges-method` for more information.
2: In valid.GenomicRanges.seqinfo(x, suggest.trim = TRUE) :
  GRanges object contains 1 out-of-bound range located on sequence MT. Note that ranges located on a
  sequence whose length is unknown (NA) or on a circular sequence are not considered out-of-bound (use
  seqlengths() and isCircular() to get the lengths and circularity flags of the underlying sequences).
  You can use trim() to trim these ranges. See ?`trim,GenomicRanges-method` for more information.
3: In valid.GenomicRanges.seqinfo(x, suggest.trim = TRUE) :
  GRanges object contains 1 out-of-bound range located on sequence MT. Note that ranges located on a
  sequence whose length is unknown (NA) or on a circular sequence are not considered out-of-bound (use
  seqlengths() and isCircular() to get the lengths and circularity flags of the underlying sequences).
  You can use trim() to trim these ranges. See ?`trim,GenomicRanges-method` for more information.
4: In max(mplot_dfs$Position) :
  no non-missing arguments to max; returning -Inf

```

GenomicPlot • 179 views
ADD COMMENT

Login before adding your answer.

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