[BioC] GenomicRanges BamFileList() not a function anymore?

Martin Morgan mtmorgan at fhcrc.org
Thu May 2 22:38:48 CEST 2013


On 05/02/2013 01:35 PM, Sam McInturf wrote:
> Bioconductor users,
>     I have been mapping my RNA seq reads using the GenomicRanges package,
> and was doing alright with it until I upgraded to R-3.0.0.  At least I
> assume that the upgrade was the problem.  After loading GenomicRanges the
> function BamFileList() is not longer a function.  As below
>
>> library(GenomicRanges)
> 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 object is masked from âpackage:statsâ:
>
>      xtabs
>
> The following objects are masked from âpackage:baseâ:
>
>      anyDuplicated, as.data.frame, cbind, colnames, duplicated, eval,
>      Filter, Find, get, intersect, lapply, Map, mapply, match, mget,
>      order, paste, pmax, pmax.int, pmin, pmin.int, Position, rank,
>      rbind, Reduce, rep.int, rownames, sapply, setdiff, sort, table,
>      tapply, union, unique, unlist
>
> Loading required package: IRanges
>
>> BamFileList()
> Error: could not find function "BamFileList"
>
> I work on two clusters, and both no longer work.  What am I doing wrong, or
> what is an alternative to this method?  I have been following the
> summerizeOverlaps vignette for mapping.

Hi Sam --

It's defined in the Rsamtools package, so

   library(Rsamtools)
   BamFileList()

Martin

>
> thanks in advance!
>
>
>
>
> _______________________________________________
> Bioconductor mailing list
> Bioconductor at r-project.org
> https://stat.ethz.ch/mailman/listinfo/bioconductor
> Search the archives: http://news.gmane.org/gmane.science.biology.informatics.conductor
>


-- 
Computational Biology / Fred Hutchinson Cancer Research Center
1100 Fairview Ave. N.
PO Box 19024 Seattle, WA 98109

Location: Arnold Building M1 B861
Phone: (206) 667-2793



More information about the Bioconductor mailing list