1 Introduction

GDSArray is a Bioconductor package that represents GDS files as objects derived from the DelayedArray package and DelayedArray class. It converts a GDS node in the file to a DelayedArray-derived data structure. The rich common methods and data operations defined on GDSArray makes it more R-user-friendly than working with the GDS file directly. The array data from GDS files are always returned with the first dimension being variants/snps and the second dimension being samples. This feature is consistent with the assay data saved in SummarizedExperiment, and makes the GDSArray package interoperable with other established Bioconductor data infrastructure.

2 Package installation

  1. Download the package from Bioconductor.
if (!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")
BiocManager::install("GDSArray")
  1. Load the package into R session.
library(GDSArray)

3 GDS format introduction

3.1 Genomic Data Structure (GDS)

The Bioconductor package gdsfmt has provided a high-level R interface to CoreArray Genomic Data Structure (GDS) data files, which is designed for large-scale datasets, especially for data which are much larger than the available random-access memory.

The GDS format has been widely used in genetic/genomic research for high-throughput genotyping or sequencing data. There are two major classes that extends the gds.class: SNPGDSFileClass suited for genotyping data (e.g., GWAS), and SeqVarGDSClass that are designed specifically for DNA-sequencing data. The file format attribute in each data class is set as SNP_ARRAY and SEQ_ARRAY. There are rich functions written based on these data classes for common data operation and statistical analysis.

More details about GDS format can be found in the vignettes of the gdsfmt, SNPRelate, and SeqArray packages.

4 GDSArray, GDSMatrix, and GDSFile

GDSArray represents GDS files as DelayedArray instances. It has methods like dim, dimnames defined, and it inherits array-like operations and methods from DelayedArray, e.g., the subsetting method of [.

4.1 GDSArray, GDSMatrix, and DelayedArray

The GDSArray() constructor takes as arguments the file path and the GDS node inside the GDS file. The GDSArray() constructor always returns the object with rows being features (genes / variants / snps) and the columns being “samples”. This is consistent with the assay data inside SummarizedExperiment.

file <- SeqArray::seqExampleFileName("gds")
#> GDSArray(file, "genotype")  #> deactivate temporarily 3/4/20

A GDSMatrix is a 2-dimensional GDSArray, and will be returned from the GDSArray() constructor automatically if the input GDS node is 2-dimensional.

GDSArray(file, "annotation/format/DP")
## <1348 x 90> matrix of class GDSMatrix and type "integer":
##      NA06984 NA06985 NA06986 NA06989 ... NA12889 NA12890 NA12891 NA12892
##    1       0       0     107       0   .       3      81      67     156
##    2       0       0      92       0   .       4      84      47     150
##    3      12      17     247      11   .       9     217     134     417
##  ...       .       .       .       .   .       .       .       .       .
## 1346       5       8      15       1   .       3      61      57     101
## 1347       4       7      26       1   .       4      92      71     144
## 1348       0       0       3       0   .       0       0       2       2

4.2 GDSFile

The GDSFile is a light-weight class to represent GDS files. It has the $ completion method to complete any possible gds nodes. It could be used as a convenient GDSArray constructor if the slot of current_path in GDSFile object represents a valid gds node. Otherwise, it will return the GDSFile object with an updated current_path.

gf <- GDSFile(file)
gf$annotation$info
## class: GDSFile
## file: /home/biocbuild/bbs-3.11-bioc/R/library/SeqArray/extdata/CEU_Exon.gds
## current node: annotation/info
## subnodes:
##   annotation/info/AA
##   annotation/info/AC
##   annotation/info/AN
##   annotation/info/DP
##   annotation/info/HM2
##   annotation/info/HM3
##   annotation/info/OR
##   annotation/info/GP
##   annotation/info/BN
gf$annotation$info$AC
## <1348> array of class GDSArray and type "integer":
##    1    2    3    4    . 1345 1346 1347 1348 
##    4    1    6  128    .    2   11    1    1

Try typing in gf$ann and pressing tab key for the completion.

4.3 GDSArray methods

4.3.1 slot accessors.

  • seed returns the GDSArraySeed of the GDSArray object.
#> ga <- GDSArray(file, "genotype")  #> deactivate temporarily 3/4/20
#> seed(ga)
  • gdsfile returns the file path of the corresponding GDS file.
#> gdsfile(ga)

4.3.2 Available GDS nodes

gdsnodes() takes the GDS file path or GDSFile object as input, and returns all nodes that can be converted to GDSArray instances. The returned GDS node names can be used as input for the GDSArray(name=) constructor.

gdsnodes(file)
##  [1] "sample.id"            "variant.id"           "position"            
##  [4] "chromosome"           "allele"               "genotype"            
##  [7] "annotation/id"        "annotation/qual"      "annotation/filter"   
## [10] "annotation/info/AA"   "annotation/info/AC"   "annotation/info/AN"  
## [13] "annotation/info/DP"   "annotation/info/HM2"  "annotation/info/HM3" 
## [16] "annotation/info/OR"   "annotation/info/GP"   "annotation/info/BN"  
## [19] "annotation/format/DP"
identical(gdsnodes(file), gdsnodes(gf))
## [1] TRUE
GDSArray(file, name=gdsnodes(file)[2])
## <1348> array of class GDSArray and type "integer":
##    1    2    3    4    . 1345 1346 1347 1348 
##    1    2    3    4    . 1345 1346 1347 1348

4.3.3 dim(), dimnames()

The dimnames(GDSArray) returns an unnamed list, with the length of each element to be the same as return from dim(GDSArray).

ga <- GDSArray(file, "annotation/format/DP")
dim(ga)
## [1] 1348   90
class(dimnames(ga))
## [1] "list"
lengths(dimnames(ga))
## variant.id  sample.id 
##       1348         90

4.3.4 [ subsetting

GDSArray instances can be subset, following the usual R conventions, with numeric or logical vectors; logical vectors are recycled to the appropriate length.

ga[1:3, 10:15]
## <3 x 6> matrix of class DelayedMatrix and type "integer":
##           sample.id
## variant.id NA07346 NA07347 NA07357 NA10847 NA10851 NA11829
##          1      69      53     225       0       6      79
##          2      60      47     126       0       5      79
##          3     203     238     258       2      25     237
ga[c(TRUE, FALSE), ]
## <674 x 90> matrix of class DelayedMatrix and type "integer":
##      NA06984 NA06985 NA06986 NA06989 ... NA12889 NA12890 NA12891 NA12892
##    1       0       0     107       0   .       3      81      67     156
##    3      12      17     247      11   .       9     217     134     417
##    5      70      24     219      65   .       5     149     104     327
##  ...       .       .       .       .   .       .       .       .       .
## 1343      47      20     233      34   .       4      28      98     241
## 1345       6      10      28       3   .       4      36      46      78
## 1347       4       7      26       1   .       4      92      71     144

4.3.5 some numeric calculation

dp <- GDSArray(file, "annotation/format/DP")
dp
## <1348 x 90> matrix of class GDSMatrix and type "integer":
##      NA06984 NA06985 NA06986 NA06989 ... NA12889 NA12890 NA12891 NA12892
##    1       0       0     107       0   .       3      81      67     156
##    2       0       0      92       0   .       4      84      47     150
##    3      12      17     247      11   .       9     217     134     417
##  ...       .       .       .       .   .       .       .       .       .
## 1346       5       8      15       1   .       3      61      57     101
## 1347       4       7      26       1   .       4      92      71     144
## 1348       0       0       3       0   .       0       0       2       2
log(dp)
## <1348 x 90> matrix of class DelayedMatrix and type "double":
##       NA06984  NA06985  NA06986 ...   NA12891   NA12892
##    1     -Inf     -Inf 4.672829   .  4.204693  5.049856
##    2     -Inf     -Inf 4.521789   .  3.850148  5.010635
##    3 2.484907 2.833213 5.509388   .  4.897840  6.033086
##  ...        .        .        .   .         .         .
## 1346 1.609438 2.079442 2.708050   . 4.0430513 4.6151205
## 1347 1.386294 1.945910 3.258097   . 4.2626799 4.9698133
## 1348     -Inf     -Inf 1.098612   . 0.6931472 0.6931472
dp[rowMeans(dp) < 60, ]
## <413 x 90> matrix of class DelayedMatrix and type "integer":
##      NA06984 NA06985 NA06986 NA06989 ... NA12889 NA12890 NA12891 NA12892
##    1       0       0     107       0   .       3      81      67     156
##    2       0       0      92       0   .       4      84      47     150
##    4      15       4     177       1   .       2     110     111     195
##  ...       .       .       .       .   .       .       .       .       .
## 1346       5       8      15       1   .       3      61      57     101
## 1347       4       7      26       1   .       4      92      71     144
## 1348       0       0       3       0   .       0       0       2       2

4.4 Internals: GDSArraySeed

The GDSArraySeed class represents the ‘seed’ for the GDSArray object. It is not exported from the GDSArray package. Seed objects should contain the GDS file path, and are expected to satisfy the “seed contract” i.e. to support dim() and dimnames().

#> seed <- GDSArray:::GDSArraySeed(file, "genotype")  #> deactivate temporarily 3/4/20
#> seed

The seed can be used to construct a GDSArray instance.

#> GDSArray(seed)

The DelayedArray() constructor with GDSArraySeed object as argument will return the same content as the GDSArray() constructor over the same GDSArraySeed.

#> class(DelayedArray(seed))

5 sessionInfo

sessionInfo()
## R version 4.0.0 (2020-04-24)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.4 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.11-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.11-bioc/R/lib/libRlapack.so
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_US.UTF-8        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       
## 
## attached base packages:
## [1] stats4    parallel  stats     graphics  grDevices utils     datasets 
## [8] methods   base     
## 
## other attached packages:
## [1] GDSArray_1.8.0      DelayedArray_0.14.0 IRanges_2.22.0     
## [4] S4Vectors_0.26.0    matrixStats_0.56.0  BiocGenerics_0.34.0
## [7] gdsfmt_1.24.0       BiocStyle_2.16.0   
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_1.0.4.6           XVector_0.28.0         knitr_1.28            
##  [4] magrittr_1.5           zlibbioc_1.34.0        GenomicRanges_1.40.0  
##  [7] lattice_0.20-41        rlang_0.4.5            GenomeInfoDb_1.24.0   
## [10] stringr_1.4.0          tools_4.0.0            grid_4.0.0            
## [13] xfun_0.13              SeqArray_1.28.0        htmltools_0.4.0       
## [16] yaml_2.2.1             digest_0.6.25          SNPRelate_1.22.0      
## [19] crayon_1.3.4           bookdown_0.18          Matrix_1.2-18         
## [22] GenomeInfoDbData_1.2.3 BiocManager_1.30.10    bitops_1.0-6          
## [25] RCurl_1.98-1.2         evaluate_0.14          rmarkdown_2.1         
## [28] stringi_1.4.6          compiler_4.0.0         Biostrings_2.56.0