Name Mode Size
.github 040000
R 040000
inst 040000
man 040000
tests 040000
vignettes 040000
.Rbuildignore 100644 0 kb
.gitignore 100644 0 kb
DESCRIPTION 100644 1 kb
LICENSE 100644 1 kb
NAMESPACE 100644 1 kb
README.md 100644 2 kb
README.md
# Save genomic ranges objects to file |Environment|Status| |---|---| |[BioC-release](https://bioconductor.org/packages/release/bioc/html/alabaster.ranges.html)|[![Release OK](https://bioconductor.org/shields/build/release/bioc/alabaster.ranges.svg)](http://bioconductor.org/checkResults/release/bioc-LATEST/alabaster.ranges/)| |[BioC-devel](https://bioconductor.org/packages/devel/bioc/html/alabaster.ranges.html)|[![Devel OK](https://bioconductor.org/shields/build/devel/bioc/alabaster.ranges.svg)](http://bioconductor.org/checkResults/devel/bioc-LATEST/alabaster.ranges/)| The **alabaster.ranges** package implements methods for saving and loading `GRanges` and `GRangesList` objects under the **alabaster** framework. It provides a language-agnostic method for serializing genomic coordinates in these objects, as well as data in related objects like compressed lists. To get started, install the package and its dependencies from [Bioconductor](https://bioconductor.org/packages/alabaster.ranges): ```r # install.packages("BiocManager") BiocManager::install("alabaster.ranges") ``` We can then save a `GRanges` to a file, preserving its `metadata` and `mcols`: ```r library(GenomicRanges) gr <- GRanges("chrA", IRanges(sample(100), width=sample(100))) mcols(gr)$score <- runif(length(gr)) metadata(gr)$genome <- "Aaron" library(alabaster.ranges) tmp <- tempfile() saveObject(gr, tmp) roundtrip <- loadObject(tmp) class(roundtrip) ## [1] "GRanges" ## attr(,"package") ## [1] "GenomicRanges" ``` Same for a `GRangesList` to a file: ```r exons <- GRanges("chrA", IRanges(sample(100), width=sample(100))) genes <- split(exons, sample(LETTERS, 100, replace=TRUE)) mcols(genes)$score <- runif(length(genes)) metadata(genes)$genome <- "Aaron" library(alabaster.ranges) tmp <- tempfile() saveObject(genes, tmp) roundtrip <- loadObject(tmp) class(roundtrip) ## [1] "CompressedGRangesList" ## attr(,"package") ## [1] "GenomicRanges" ```