if (!requireNamespace("BiocManager", quietly = TRUE))
install.packages("BiocManager")
BiocManager::install("SingleCellMultiModal")
library(SingleCellMultiModal)
library(MultiAssayExperiment)
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).
The user can see the available dataset by using the default options
GTseq("mouse_embryo_8_cell", mode = "*", dry.run = TRUE)
## 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()
## 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>
To obtain the actual datasets:
gts <- GTseq(dry.run = FALSE)
## Warning: sampleMap[['assay']] coerced with as.factor()
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
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
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
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).
sessionInfo()
## R version 4.3.1 (2023-06-16)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.3 LTS
##
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.18-bioc/R/lib/libRblas.so
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.10.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] RaggedExperiment_1.26.0 Matrix_1.6-1.1
## [3] SingleCellExperiment_1.24.0 SingleCellMultiModal_1.14.0
## [5] MultiAssayExperiment_1.28.0 SummarizedExperiment_1.32.0
## [7] Biobase_2.62.0 GenomicRanges_1.54.0
## [9] GenomeInfoDb_1.38.0 IRanges_2.36.0
## [11] S4Vectors_0.40.0 BiocGenerics_0.48.0
## [13] MatrixGenerics_1.14.0 matrixStats_1.0.0
## [15] BiocStyle_2.30.0
##
## loaded via a namespace (and not attached):
## [1] tidyselect_1.2.0 dplyr_1.1.3
## [3] blob_1.2.4 filelock_1.0.2
## [5] Biostrings_2.70.1 bitops_1.0-7
## [7] fastmap_1.1.1 RCurl_1.98-1.12
## [9] BiocFileCache_2.10.0 promises_1.2.1
## [11] digest_0.6.33 mime_0.12
## [13] lifecycle_1.0.3 ellipsis_0.3.2
## [15] KEGGREST_1.42.0 interactiveDisplayBase_1.40.0
## [17] RSQLite_2.3.1 magrittr_2.0.3
## [19] compiler_4.3.1 rlang_1.1.1
## [21] sass_0.4.7 tools_4.3.1
## [23] utf8_1.2.4 yaml_2.3.7
## [25] knitr_1.44 S4Arrays_1.2.0
## [27] bit_4.0.5 curl_5.1.0
## [29] DelayedArray_0.28.0 abind_1.4-5
## [31] withr_2.5.1 purrr_1.0.2
## [33] grid_4.3.1 fansi_1.0.5
## [35] ExperimentHub_2.10.0 xtable_1.8-4
## [37] cli_3.6.1 rmarkdown_2.25
## [39] crayon_1.5.2 generics_0.1.3
## [41] rjson_0.2.21 httr_1.4.7
## [43] BiocBaseUtils_1.4.0 DBI_1.1.3
## [45] cachem_1.0.8 zlibbioc_1.48.0
## [47] AnnotationDbi_1.64.0 formatR_1.14
## [49] BiocManager_1.30.22 XVector_0.42.0
## [51] vctrs_0.6.4 jsonlite_1.8.7
## [53] bookdown_0.36 bit64_4.0.5
## [55] magick_2.8.1 jquerylib_0.1.4
## [57] glue_1.6.2 BiocVersion_3.18.0
## [59] later_1.3.1 tibble_3.2.1
## [61] pillar_1.9.0 rappdirs_0.3.3
## [63] htmltools_0.5.6.1 GenomeInfoDbData_1.2.11
## [65] R6_2.5.1 dbplyr_2.3.4
## [67] evaluate_0.22 shiny_1.7.5.1
## [69] lattice_0.22-5 AnnotationHub_3.10.0
## [71] png_0.1-8 SpatialExperiment_1.12.0
## [73] memoise_2.0.1 httpuv_1.6.12
## [75] bslib_0.5.1 Rcpp_1.0.11
## [77] SparseArray_1.2.0 xfun_0.40
## [79] pkgconfig_2.0.3
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.