XStringSets to artifacts and back againalabaster.string 1.8.0
The alabaster.string package implements methods to save XStringSet objects to file artifacts and load them back into R.
Check out the alabaster.base for more details on the motivation and concepts of the alabaster framework.
Given an XStringSet, we can use saveObject() to save it inside a staging directory:
library(Biostrings)
x <- DNAStringSet(c(seq1="CTCNACCAGTAT", seq2="TTGA", seq3="TACCTAGAG"))
mcols(x)$score <- runif(length(x))
x## DNAStringSet object of length 3:
##     width seq                                               names               
## [1]    12 CTCNACCAGTAT                                      seq1
## [2]     4 TTGA                                              seq2
## [3]     9 TACCTAGAG                                         seq3library(alabaster.string)
tmp <- tempfile()
saveObject(x, tmp)
list.files(tmp, recursive=TRUE)## [1] "OBJECT"                               
## [2] "_environment.json"                    
## [3] "names.txt.gz"                         
## [4] "sequence_annotations/OBJECT"          
## [5] "sequence_annotations/basic_columns.h5"
## [6] "sequences.fasta.gz"We can then load it back into the session with readObject().
roundtrip <- readObject(tmp)
class(roundtrip)## [1] "DNAStringSet"
## attr(,"package")
## [1] "Biostrings"More details on the metadata and on-disk layout are provided in the schema.
The same approach works with QualityScaledXStringSet objects:
x <- DNAStringSet(c("TTGA", "CTCN"))
q <- PhredQuality(c("*+,-", "6789"))
y <- QualityScaledDNAStringSet(x, q)
library(alabaster.string)
tmp <- tempfile()
saveObject(y, tmp)
roundtrip <- readObject(tmp)
class(roundtrip)## [1] "QualityScaledDNAStringSet"
## attr(,"package")
## [1] "Biostrings"sessionInfo()## R version 4.5.0 RC (2025-04-04 r88126)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 24.04.2 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.21-bioc/R/lib/libRblas.so 
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.12.0  LAPACK version 3.12.0
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_GB              LC_COLLATE=C              
##  [5] LC_MONETARY=en_US.UTF-8    LC_MESSAGES=en_US.UTF-8   
##  [7] LC_PAPER=en_US.UTF-8       LC_NAME=C                 
##  [9] LC_ADDRESS=C               LC_TELEPHONE=C            
## [11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C       
## 
## time zone: America/New_York
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] alabaster.string_1.8.0 alabaster.base_1.8.0   Biostrings_2.76.0     
##  [4] GenomeInfoDb_1.44.0    XVector_0.48.0         IRanges_2.42.0        
##  [7] S4Vectors_0.46.0       BiocGenerics_0.54.0    generics_0.1.3        
## [10] BiocStyle_2.36.0      
## 
## loaded via a namespace (and not attached):
##  [1] crayon_1.5.3            httr_1.4.7              cli_3.6.4              
##  [4] knitr_1.50              rlang_1.1.6             xfun_0.52              
##  [7] UCSC.utils_1.4.0        jsonlite_2.0.0          htmltools_0.5.8.1      
## [10] sass_0.4.10             rmarkdown_2.29          evaluate_1.0.3         
## [13] jquerylib_0.1.4         fastmap_1.2.0           Rhdf5lib_1.30.0        
## [16] alabaster.schemas_1.8.0 yaml_2.3.10             lifecycle_1.0.4        
## [19] bookdown_0.43           BiocManager_1.30.25     compiler_4.5.0         
## [22] Rcpp_1.0.14             rhdf5filters_1.20.0     rhdf5_2.52.0           
## [25] digest_0.6.37           R6_2.6.1                GenomeInfoDbData_1.2.14
## [28] bslib_0.9.0             tools_4.5.0             cachem_1.1.0