1 Installation

if (!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")

BiocManager::install("SingleCellMultiModal")

1.1 Load

library(SingleCellMultiModal)
library(MultiAssayExperiment)

2 G&T-seq: parallel sequencing data of single-cell genomes and transcriptomes

G&T-seq is a combination of Picoplex amplified gDNA sequencing (genome) and SMARTSeq2 amplified cDNA sequencing (transcriptome) of the same cell. For more information, see Macaulay et al. (2015).

2.1 Downloading datasets

The user can see the available dataset by using the default options

GTseq("mouse_embryo_8_cell", mode = "*", dry.run = TRUE)
## snapshotDate(): 2021-10-18
##    ah_id           mode file_size           rdataclass rdatadateadded
## 1 EH5431        genomic      0 Mb     RaggedExperiment     2021-03-24
## 2 EH5433 transcriptomic    2.3 Mb SingleCellExperiment     2021-03-24
##   rdatadateremoved
## 1             <NA>
## 2             <NA>

Or by simply running:

GTseq()
## snapshotDate(): 2021-10-18
##    ah_id           mode file_size           rdataclass rdatadateadded
## 1 EH5431        genomic      0 Mb     RaggedExperiment     2021-03-24
## 2 EH5433 transcriptomic    2.3 Mb SingleCellExperiment     2021-03-24
##   rdatadateremoved
## 1             <NA>
## 2             <NA>

2.2 Obtaining the data

To obtain the actual datasets:

gts <- GTseq(dry.run = FALSE)
gts
## A MultiAssayExperiment object of 2 listed
##  experiments with user-defined names and respective classes.
##  Containing an ExperimentList class object of length 2:
##  [1] genomic: RaggedExperiment with 2366 rows and 112 columns
##  [2] transcriptomic: SingleCellExperiment with 24029 rows and 112 columns
## Functionality:
##  experiments() - obtain the ExperimentList instance
##  colData() - the primary/phenotype DataFrame
##  sampleMap() - the sample coordination DataFrame
##  `$`, `[`, `[[` - extract colData columns, subset, or experiment
##  *Format() - convert into a long or wide DataFrame
##  assays() - convert ExperimentList to a SimpleList of matrices
##  exportClass() - save data to flat files

2.3 Exploring the data structure

Check available metadata for each of the 112 mouse embryo cells assayed by G&T-seq:

colData(gts)
## DataFrame with 112 rows and 3 columns
##         Characteristics.organism. Characteristics.sex.
##                       <character>          <character>
## cell1                Mus musculus               female
## cell2                Mus musculus               female
## cell3                Mus musculus                 male
## cell4                Mus musculus                 male
## cell5                Mus musculus               female
## ...                           ...                  ...
## cell108              Mus musculus               female
## cell109              Mus musculus                 male
## cell110              Mus musculus                 male
## cell111              Mus musculus               female
## cell112              Mus musculus               female
##         Characteristics.cell.type.
##                        <character>
## cell1       8_cell_stage_single_..
## cell2       8_cell_stage_single_..
## cell3       8_cell_stage_single_..
## cell4       8_cell_stage_single_..
## cell5       8_cell_stage_single_..
## ...                            ...
## cell108     8_cell_stage_single_..
## cell109     8_cell_stage_single_..
## cell110     8_cell_stage_single_..
## cell111     8_cell_stage_single_..
## cell112     8_cell_stage_single_..

Take a peek at the sampleMap:

sampleMap(gts)
## DataFrame with 224 rows and 3 columns
##              assay     primary     colname
##           <factor> <character> <character>
## 1   transcriptomic       cell1   ERR861694
## 2   transcriptomic       cell2   ERR861750
## 3   transcriptomic       cell3   ERR861695
## 4   transcriptomic       cell4   ERR861751
## 5   transcriptomic       cell5   ERR861696
## ...            ...         ...         ...
## 220        genomic     cell108   ERR863164
## 221        genomic     cell109   ERR863109
## 222        genomic     cell110   ERR863165
## 223        genomic     cell111   ERR863110
## 224        genomic     cell112   ERR863166

2.4 Copy numbers

To access the integer copy numbers as detected from scDNA-seq:

head(assay(gts, "genomic"))[, 1:4]
##                          ERR863111 ERR863834 ERR863112 ERR863835
## chr1:23000001-25500000          NA        NA        NA        NA
## chr4:112000001-114500000        NA        NA        NA        NA
## chr4:145000001-148500000        NA        NA        NA        NA
## chr5:14000001-16500000          NA        NA        NA        NA
## chr15:66500001-69000000         NA        NA        NA        NA
## chrX:21500001-36000000          NA        NA        NA        NA

2.5 RNA-seq

To access raw read counts as quantified from scRNA-seq:

head(assay(gts, "transcriptomic"))[, 1:4]
##                    ERR861694 ERR861750 ERR861695 ERR861751
## ENSMUSG00000000001         4         7        30        32
## ENSMUSG00000000003         0         0         0         0
## ENSMUSG00000000028        11        17        79        94
## ENSMUSG00000000031         0         0         0         0
## ENSMUSG00000000037         0         0         1         0
## ENSMUSG00000000049         0         0         0         0

For protocol information, see Macaulay et al. (2016).

3 sessionInfo

sessionInfo()
## R version 4.1.1 (2021-08-10)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.14-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.14-bioc/R/lib/libRlapack.so
## 
## 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       
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] RaggedExperiment_1.18.0     SingleCellMultiModal_1.6.0 
##  [3] MultiAssayExperiment_1.20.0 SummarizedExperiment_1.24.0
##  [5] Biobase_2.54.0              GenomicRanges_1.46.0       
##  [7] GenomeInfoDb_1.30.0         IRanges_2.28.0             
##  [9] S4Vectors_0.32.0            BiocGenerics_0.40.0        
## [11] MatrixGenerics_1.6.0        matrixStats_0.61.0         
## [13] BiocStyle_2.22.0           
## 
## loaded via a namespace (and not attached):
##  [1] bitops_1.0-7                  bit64_4.0.5                  
##  [3] filelock_1.0.2                httr_1.4.2                   
##  [5] tools_4.1.1                   bslib_0.3.1                  
##  [7] utf8_1.2.2                    R6_2.5.1                     
##  [9] HDF5Array_1.22.0              DBI_1.1.1                    
## [11] rhdf5filters_1.6.0            withr_2.4.2                  
## [13] tidyselect_1.1.1              bit_4.0.4                    
## [15] curl_4.3.2                    compiler_4.1.1               
## [17] formatR_1.11                  DelayedArray_0.20.0          
## [19] bookdown_0.24                 sass_0.4.0                   
## [21] rappdirs_0.3.3                stringr_1.4.0                
## [23] digest_0.6.28                 SpatialExperiment_1.4.0      
## [25] rmarkdown_2.11                R.utils_2.11.0               
## [27] XVector_0.34.0                pkgconfig_2.0.3              
## [29] htmltools_0.5.2               sparseMatrixStats_1.6.0      
## [31] limma_3.50.0                  dbplyr_2.1.1                 
## [33] fastmap_1.1.0                 rlang_0.4.12                 
## [35] RSQLite_2.2.8                 shiny_1.7.1                  
## [37] DelayedMatrixStats_1.16.0     jquerylib_0.1.4              
## [39] generics_0.1.1                jsonlite_1.7.2               
## [41] BiocParallel_1.28.0           R.oo_1.24.0                  
## [43] dplyr_1.0.7                   RCurl_1.98-1.5               
## [45] magrittr_2.0.1                scuttle_1.4.0                
## [47] GenomeInfoDbData_1.2.7        Matrix_1.3-4                 
## [49] Rcpp_1.0.7                    Rhdf5lib_1.16.0              
## [51] fansi_0.5.0                   lifecycle_1.0.1              
## [53] R.methodsS3_1.8.1             edgeR_3.36.0                 
## [55] stringi_1.7.5                 yaml_2.2.1                   
## [57] zlibbioc_1.40.0               rhdf5_2.38.0                 
## [59] BiocFileCache_2.2.0           AnnotationHub_3.2.0          
## [61] grid_4.1.1                    blob_1.2.2                   
## [63] dqrng_0.3.0                   parallel_4.1.1               
## [65] promises_1.2.0.1              ExperimentHub_2.2.0          
## [67] crayon_1.4.1                  lattice_0.20-45              
## [69] beachmat_2.10.0               Biostrings_2.62.0            
## [71] KEGGREST_1.34.0               magick_2.7.3                 
## [73] locfit_1.5-9.4                knitr_1.36                   
## [75] pillar_1.6.4                  rjson_0.2.20                 
## [77] glue_1.4.2                    BiocVersion_3.14.0           
## [79] evaluate_0.14                 BiocManager_1.30.16          
## [81] vctrs_0.3.8                   png_0.1-7                    
## [83] httpuv_1.6.3                  purrr_0.3.4                  
## [85] assertthat_0.2.1              cachem_1.0.6                 
## [87] xfun_0.27                     DropletUtils_1.14.0          
## [89] mime_0.12                     xtable_1.8-4                 
## [91] later_1.3.0                   SingleCellExperiment_1.16.0  
## [93] tibble_3.1.5                  AnnotationDbi_1.56.1         
## [95] memoise_2.0.0                 ellipsis_0.3.2               
## [97] interactiveDisplayBase_1.32.0

References

Macaulay, Iain C, Wilfried Haerty, Parveen Kumar, Yang I Li, Tim Xiaoming Hu, Mabel J Teng, Mubeen Goolam, et al. 2015. “G&T-seq: Parallel Sequencing of Single-Cell Genomes and Transcriptomes.” Nat. Methods 12 (6): 519–22.

Macaulay, Iain C, Mabel J Teng, Wilfried Haerty, Parveen Kumar, Chris P Ponting, and Thierry Voet. 2016. “Separation and Parallel Sequencing of the Genomes and Transcriptomes of Single Cells Using G&T-seq.” Nat. Protoc. 11 (11): 2081–2103.