TAPseq 1.16.0
One application of TAP-seq is to measure the expression of genes that enable assigning cells to different cell types. The TAPseq package offers a simple approach to identify a desired number of cell type markers based on differentially expressed genes between cell types.
This optional functionality requires additional R-packages such as Seurat. Please install the TAPseq package with all suggested dependencies.
The TAPseq package contains a small subset of the mouse bone marrow data from Baccin et al., 2019 (https://www.nature.com/articles/s41556-019-0439-6). The full dataset can be downloaded here. This dataset is stored in a Seurat object which contains both gene expression and cell type data for every cell.
library(TAPseq)
library(Seurat)
# example of mouse bone marrow 10x gene expression data
data("bone_marrow_genex")
# transcript counts
GetAssayData(bone_marrow_genex)[1:10, 1:10]
# number of cells per cell type
table(Idents(bone_marrow_genex))A linear model with lasso regularization is used to select target genes that best identify cell
types. By default 10-fold cross-validation is used to select the number of target genes based on the
largest value of lambda within 1 standard error of the minimum. See ?glmnet::cv.glmnet for more
details.
# automatically select a number of target genes using 10-fold cross-validation
target_genes_cv <- selectTargetGenes(bone_marrow_genex)
#> Warning in lognet(xd, is.sparse, ix, jx, y, weights, offset, alpha, nobs, : one
#> multinomial or binomial class has fewer than 8 observations; dangerous ground
#> Warning in lognet(xd, is.sparse, ix, jx, y, weights, offset, alpha, nobs, : one
#> multinomial or binomial class has fewer than 8 observations; dangerous ground
head(target_genes_cv)
length(target_genes_cv)This example results in a reasonable target gene panel, but in cases with many different cell types the resulting panels might be very large.
To avoid this, we can specify a desired number of targets. This selects a value for lamda in the lasso model that results in approximately this number of non-zero coefficients, i.e. marker genes.
# identify approximately 100 target genes that can be used to identify cell populations
target_genes_100 <- selectTargetGenes(bone_marrow_genex, targets = 100)
length(target_genes_100)To intuitively assess how well a chosen set of target genes distinguishes cell types, we can use UMAP plots based on the full gene expression data and on target genes only.
plotTargetGenes(bone_marrow_genex, target_genes = target_genes_100)We can see that the expression of the 100 selected target genes groups cells of different populations together.
A good follow up would be to cluster the cells based on only the target genes following the same workflow used to define the cell identities in the original object. This could then be used to verify that the selected target genes reliably identify the correct cell types.
All of the output in this vignette was produced under the following conditions:
sessionInfo()
#> R version 4.4.0 beta (2024-04-15 r86425)
#> Platform: x86_64-pc-linux-gnu
#> Running under: Ubuntu 22.04.4 LTS
#> 
#> Matrix products: default
#> BLAS:   /home/biocbuild/bbs-3.19-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] Seurat_5.0.3                      SeuratObject_5.0.1               
#>  [3] sp_2.1-4                          ggplot2_3.5.1                    
#>  [5] dplyr_1.1.4                       BSgenome.Hsapiens.UCSC.hg38_1.4.5
#>  [7] BSgenome_1.72.0                   rtracklayer_1.64.0               
#>  [9] BiocIO_1.14.0                     Biostrings_2.72.0                
#> [11] XVector_0.44.0                    BiocParallel_1.38.0              
#> [13] GenomicRanges_1.56.0              GenomeInfoDb_1.40.0              
#> [15] IRanges_2.38.0                    S4Vectors_0.42.0                 
#> [17] BiocGenerics_0.50.0               TAPseq_1.16.0                    
#> [19] BiocStyle_2.32.0                 
#> 
#> loaded via a namespace (and not attached):
#>   [1] RcppAnnoy_0.0.22            splines_4.4.0              
#>   [3] later_1.3.2                 bitops_1.0-7               
#>   [5] tibble_3.2.1                polyclip_1.10-6            
#>   [7] XML_3.99-0.16.1             fastDummies_1.7.3          
#>   [9] lifecycle_1.0.4             globals_0.16.3             
#>  [11] lattice_0.22-6              MASS_7.3-60.2              
#>  [13] magrittr_2.0.3              limma_3.60.0               
#>  [15] plotly_4.10.4               sass_0.4.9                 
#>  [17] rmarkdown_2.26              jquerylib_0.1.4            
#>  [19] yaml_2.3.8                  httpuv_1.6.15              
#>  [21] sctransform_0.4.1           spam_2.10-0                
#>  [23] spatstat.sparse_3.0-3       reticulate_1.36.1          
#>  [25] cowplot_1.1.3               pbapply_1.7-2              
#>  [27] DBI_1.2.2                   RColorBrewer_1.1-3         
#>  [29] abind_1.4-5                 zlibbioc_1.50.0            
#>  [31] Rtsne_0.17                  purrr_1.0.2                
#>  [33] RCurl_1.98-1.14             GenomeInfoDbData_1.2.12    
#>  [35] ggrepel_0.9.5               irlba_2.3.5.1              
#>  [37] spatstat.utils_3.0-4        listenv_0.9.1              
#>  [39] goftest_1.2-3               RSpectra_0.16-1            
#>  [41] spatstat.random_3.2-3       fitdistrplus_1.1-11        
#>  [43] parallelly_1.37.1           leiden_0.4.3.1             
#>  [45] codetools_0.2-20            DelayedArray_0.30.0        
#>  [47] shape_1.4.6.1               tidyselect_1.2.1           
#>  [49] UCSC.utils_1.0.0            farver_2.1.1               
#>  [51] matrixStats_1.3.0           spatstat.explore_3.2-7     
#>  [53] GenomicAlignments_1.40.0    jsonlite_1.8.8             
#>  [55] progressr_0.14.0            iterators_1.0.14           
#>  [57] ggridges_0.5.6              survival_3.6-4             
#>  [59] foreach_1.5.2               tools_4.4.0                
#>  [61] ica_1.0-3                   Rcpp_1.0.12                
#>  [63] glue_1.7.0                  gridExtra_2.3              
#>  [65] SparseArray_1.4.0           xfun_0.43                  
#>  [67] MatrixGenerics_1.16.0       withr_3.0.0                
#>  [69] BiocManager_1.30.22         fastmap_1.1.1              
#>  [71] fansi_1.0.6                 digest_0.6.35              
#>  [73] R6_2.5.1                    mime_0.12                  
#>  [75] colorspace_2.1-0            scattermore_1.2            
#>  [77] tensor_1.5                  spatstat.data_3.0-4        
#>  [79] RSQLite_2.3.6               utf8_1.2.4                 
#>  [81] tidyr_1.3.1                 generics_0.1.3             
#>  [83] data.table_1.15.4           httr_1.4.7                 
#>  [85] htmlwidgets_1.6.4           S4Arrays_1.4.0             
#>  [87] uwot_0.2.2                  pkgconfig_2.0.3            
#>  [89] gtable_0.3.5                blob_1.2.4                 
#>  [91] lmtest_0.9-40               htmltools_0.5.8.1          
#>  [93] dotCall64_1.1-1             bookdown_0.39              
#>  [95] scales_1.3.0                Biobase_2.64.0             
#>  [97] png_0.1-8                   knitr_1.46                 
#>  [99] reshape2_1.4.4              rjson_0.2.21               
#> [101] nlme_3.1-164                curl_5.2.1                 
#> [103] cachem_1.0.8                zoo_1.8-12                 
#> [105] stringr_1.5.1               KernSmooth_2.23-22         
#> [107] parallel_4.4.0              miniUI_0.1.1.1             
#> [109] AnnotationDbi_1.66.0        restfulr_0.0.15            
#> [111] pillar_1.9.0                grid_4.4.0                 
#> [113] vctrs_0.6.5                 RANN_2.6.1                 
#> [115] promises_1.3.0              xtable_1.8-4               
#> [117] cluster_2.1.6               evaluate_0.23              
#> [119] tinytex_0.50                GenomicFeatures_1.56.0     
#> [121] magick_2.8.3                cli_3.6.2                  
#> [123] compiler_4.4.0              Rsamtools_2.20.0           
#> [125] rlang_1.1.3                 crayon_1.5.2               
#> [127] future.apply_1.11.2         labeling_0.4.3             
#> [129] plyr_1.8.9                  stringi_1.8.3              
#> [131] deldir_2.0-4                viridisLite_0.4.2          
#> [133] munsell_0.5.1               lazyeval_0.2.2             
#> [135] spatstat.geom_3.2-9         glmnet_4.1-8               
#> [137] Matrix_1.7-0                RcppHNSW_0.6.0             
#> [139] patchwork_1.2.0             bit64_4.0.5                
#> [141] future_1.33.2               statmod_1.5.0              
#> [143] KEGGREST_1.44.0             shiny_1.8.1.1              
#> [145] SummarizedExperiment_1.34.0 highr_0.10                 
#> [147] ROCR_1.0-11                 igraph_2.0.3               
#> [149] memoise_2.0.1               bslib_0.7.0                
#> [151] bit_4.0.5