Contents

1 tl;dr

To demonstrate, we’ll use one of the mammary gland datasets from the scRNAseq package. We will subset it down to a random set of 500 cells for speed.

library(scRNAseq)
sce <- BachMammaryData(samples="G_2")

set.seed(1000)
sce <- sce[,sample(ncol(sce), 500)]

For the purposes of this demonstration, we’ll perform an extremely expedited analysis. One would usually take more care here and do some quality control, create some diagnostic plots, etc., but we don’t have the space for that.

library(scuttle)
sce <- logNormCounts(sce)

library(scran)
dec <- modelGeneVar(sce)

library(scater)
set.seed(1000)
sce <- runPCA(sce, ncomponents=10, subset_row=getTopHVGs(dec, n=1000))

library(bluster)
clusters <- clusterRows(reducedDim(sce, "PCA"), NNGraphParam())

sce <- runTSNE(sce, dimred="PCA")
plotTSNE(sce, colour_by=I(clusters), text_by=I(clusters))

We then run findDoubletClusters() to test each cluster against the null hypothesis that it does consist of doublets. The null is rejected if a cluster has many DE genes that lie outside the expression limits defined by the “source” clusters. On the other hand, if num.de is low, the cluster’s expression profile is consistent with the doublet hypothesis.

library(scDblFinder)
tab <- findDoubletClusters(sce, clusters)
tab
## DataFrame with 7 rows and 9 columns
##       source1     source2    num.de median.de               best     p.value
##   <character> <character> <integer> <integer>        <character>   <numeric>
## 6           2           1         0       122 ENSMUSG00000019256 1.00000e+00
## 3           6           5         8        46 ENSMUSG00000002985 8.41352e-05
## 7           5           1        11       393 ENSMUSG00000075705 2.04690e-10
## 4           7           2        24        63 ENSMUSG00000022491 4.15645e-13
## 1           7           6        86       715 ENSMUSG00000001349 8.49703e-08
## 5           7           2       112      1007 ENSMUSG00000024610 2.38765e-11
## 2           6           5       124       336 ENSMUSG00000023505 4.06936e-06
##   lib.size1 lib.size2      prop
##   <numeric> <numeric> <numeric>
## 6  0.927081  0.443667     0.084
## 3  2.026090  0.859424     0.242
## 7  1.195040  1.249946     0.030
## 4  0.630479  1.646729     0.150
## 1  0.800035  2.253942     0.192
## 5  0.836792  2.185591     0.032
## 2  1.078655  0.457542     0.270

2 Mathematical background

Consider a cell population \(i\) that has mean transcript count \(\lambda_{gi}\) for gene \(g\). Assume that each population exhibits a unique scaling bias \(s_i\), representing the efficiency of library preparation for that population. The observed read/UMI count for each gene is then \(\mu_{gi}=s_i\lambda_{gi}\). (For simplicity, we will ignore gene-specific scaling biases, as this is easily accommodated by considering \(\lambda_{gi} \equiv \phi_g \lambda_{gi}\) for some bias \(\phi_g\).) The expected total count for each population is \(N_i = \sum_g \mu_{gi}\).

Now, let us consider a doublet population \(j\) that forms from two parent populations \(i_1\) and \(i_2\). The observed read count for \(g\) in \(j\) is \(\mu_{gj} = s_j (\lambda_{gi_1} + \lambda_{gi_2})\). Note that \(s_j\) need not be any particular function of \(s_{i_1}\) and \(s_{i_2}\). Rather, this relationship depends on how quickly the reverse transcription and amplification reagents are saturated during library preparation, which is difficult to make assumptions around.

3 Normalization by library size

We obtain log-normalized expression values for each cell based on the library size. Assume that the library size-normalized expression values are such that \(\mu_{gi_1}N_{i_1}^{-1} < \mu_{gi_2}N_{i_2}^{-1}\), i.e., the proportion of \(g\) increases in \(i_2\) compared to \(i_1\). The contribution of each \(s_i\) cancels out, yielding \[ \frac{\lambda_{gi_1}}{\sum_g \lambda_{gi_1}} < \frac{\lambda_{gi_2}}{\sum_g \lambda_{gi_2}} \;. \] The normalized expression value of the doublet cluster \(j\) is subsequently \[ \frac{\lambda_{gi_1} + \lambda_{gi_2}}{\sum_g (\lambda_{gi_1} + \lambda_{gi_2})} \;, \] and it is fairly easy to show that \[ \frac{\lambda_{gi_1}}{\sum_g \lambda_{gi_1}} < \frac{\lambda_{gi_1} + \lambda_{gi_2}}{\sum_g (\lambda_{gi_1} + \lambda_{gi_2})} < \frac{\lambda_{gi_2}}{\sum_g \lambda_{gi_2}} \;. \] In other words, the expected library size-normalized expression of our gene in the doublet cluster lies between that of the two parents.

It is harder to provide theoretical guarantees with arbitrary size factors, which is why we only use the library sizes for normalization instead. The exception is that of spike-in size factors that would estimate \(s_i\) directly. This would allow us to obtain estimates of \(\lambda_{gi}\) for the parent clusters and of \(\lambda_{gi_1} + \lambda_{gi_2}\) for the doublets. In this manner, we could more precisely identify doublet clusters as those where the normalized expression value is equal to the sum of the parents. Unfortunately, spike-ins are generally not available for droplet-based data sets where doublets are most problematic.

4 Testing for (lack of) intermediacy

We want to identify the clusters that may be comprised of doublets of other clusters. For each cluster \(j'\), we test for differential expression in the library size-normalized expression profiles against every other cluster \(i'\). For each pair of other clusters \(i'_1\) and \(i'_2\), we identify genes that change in \(j'\) against both \(i'_1\) and \(i'_2\) in the same direction. The presence of such genes violates the intermediacy expected of a doublet cluster and provides evidence that \(j'\) is not a doublet of \(i'_1\) and \(i'_2\).

Significant genes are identified by an intersection-union test on the \(p\)-values from the pairwise comparisons between \(j'\) and \(i'_1\) or \(i'_2\). (Specifically, \(t\)-tests are used via the findMarkers() function from scran.) The \(p\)-value for a gene is set to unity when the signs of the log-fold changes are not the same between comparisons. Multiple correction testing is applied using the Benjamini-Hochberg method, and the number of genes detected at a specified false discovery rate (usually 5%) is counted. The pair \((i'_1, i'_2)\) with the fewest detected genes are considered as the putative parents of \(j'\).

In theory, it is possible to compute the Simes’ combined \(p\)-value across all genes to reject the doublet hypothesis for \(j'\). This would provide a more rigorous approach to ruling out potential doublet/parent combinations. However, this is very sensitive to misspecification of clusters – see below.

5 Calling doublet clusters

Assuming that most clusters are not comprised of doublets, we identify clusters that have an unusually low number of detected genes that violate the intermediacy condition. This is achieved by identifying small outliers on the log-transformed number of detected genes, using the median absolute deviation-based method in the function. (We use a log-transformation simply to improve resolution at low values.) Clusters are likely to be doublets if they are outliers on this metric.

Doublet clusters should also have larger library sizes than the proposed parent clusters. This is consistent with the presence of more RNA in each doublet, though the library size of the doublet cluster need not be a sum of that of the parent clusters (due to factors such as saturation and composition effects). The proportion of cells assigned to the doublet cluster should also be “reasonable”; exactly what this means depends on the experimental setup and the doublet rate of the protocol in use.

6 Discussion

The biggest advantage of this approach lies in its interpretability. Given a set of existing clusters, we can explicitly identify those that are likely to be doublets. We also gain some insight onto the parental origins of each putative doublet cluster, which may be of some interest. We avoid any assumptions about doublet formation that are otherwise necessary for the simulation-based methods. In particular, we do not require any knowledge about exact the relationship between \(s_j\) and \(s_i\), allowing us to identify doublets even when the exact location of the doublet is unknown (e.g., due to differences in RNA content between the parent clusters).

The downside is that, of course, we are dependent on being supplied with sensible clusters where the parental and doublet cells are separated. The intermediacy requirement is loose enough to provide some robustness against misspecification, but this only goes so far. In addition, this strategy has a bias towards calling clusters with few cells as doublets (or parents of doublets) because the DE detection power is low. This can be somewhat offset by comparing num.de against median.de as latter will be low for clusters involved in systematically low-powered comparisons, though it is difficult to adjust for the exact effect of the differences of power on the IUT.

Session information

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] bluster_1.12.0              scDblFinder_1.16.0         
##  [3] scater_1.30.0               ggplot2_3.4.4              
##  [5] scran_1.30.0                scuttle_1.12.0             
##  [7] ensembldb_2.26.0            AnnotationFilter_1.26.0    
##  [9] GenomicFeatures_1.54.0      AnnotationDbi_1.64.0       
## [11] Matrix_1.6-1.1              scRNAseq_2.15.0            
## [13] SingleCellExperiment_1.24.0 SummarizedExperiment_1.32.0
## [15] Biobase_2.62.0              GenomicRanges_1.54.0       
## [17] GenomeInfoDb_1.38.0         IRanges_2.36.0             
## [19] S4Vectors_0.40.0            BiocGenerics_0.48.0        
## [21] MatrixGenerics_1.14.0       matrixStats_1.0.0          
## [23] BiocStyle_2.30.0           
## 
## loaded via a namespace (and not attached):
##   [1] jsonlite_1.8.7                magrittr_2.0.3               
##   [3] magick_2.8.1                  ggbeeswarm_0.7.2             
##   [5] farver_2.1.1                  rmarkdown_2.25               
##   [7] BiocIO_1.12.0                 zlibbioc_1.48.0              
##   [9] vctrs_0.6.4                   memoise_2.0.1                
##  [11] Rsamtools_2.18.0              DelayedMatrixStats_1.24.0    
##  [13] RCurl_1.98-1.12               htmltools_0.5.6.1            
##  [15] S4Arrays_1.2.0                progress_1.2.2               
##  [17] AnnotationHub_3.10.0          curl_5.1.0                   
##  [19] BiocNeighbors_1.20.0          xgboost_1.7.5.1              
##  [21] SparseArray_1.2.0             sass_0.4.7                   
##  [23] bslib_0.5.1                   cachem_1.0.8                 
##  [25] GenomicAlignments_1.38.0      igraph_1.5.1                 
##  [27] mime_0.12                     lifecycle_1.0.3              
##  [29] pkgconfig_2.0.3               rsvd_1.0.5                   
##  [31] R6_2.5.1                      fastmap_1.1.1                
##  [33] GenomeInfoDbData_1.2.11       shiny_1.7.5.1                
##  [35] digest_0.6.33                 colorspace_2.1-0             
##  [37] dqrng_0.3.1                   irlba_2.3.5.1                
##  [39] ExperimentHub_2.10.0          RSQLite_2.3.1                
##  [41] beachmat_2.18.0               labeling_0.4.3               
##  [43] filelock_1.0.2                fansi_1.0.5                  
##  [45] httr_1.4.7                    abind_1.4-5                  
##  [47] compiler_4.3.1                bit64_4.0.5                  
##  [49] withr_2.5.1                   BiocParallel_1.36.0          
##  [51] viridis_0.6.4                 DBI_1.1.3                    
##  [53] biomaRt_2.58.0                MASS_7.3-60                  
##  [55] rappdirs_0.3.3                DelayedArray_0.28.0          
##  [57] rjson_0.2.21                  tools_4.3.1                  
##  [59] vipor_0.4.5                   beeswarm_0.4.0               
##  [61] interactiveDisplayBase_1.40.0 httpuv_1.6.12                
##  [63] glue_1.6.2                    restfulr_0.0.15              
##  [65] promises_1.2.1                grid_4.3.1                   
##  [67] Rtsne_0.16                    cluster_2.1.4                
##  [69] generics_0.1.3                gtable_0.3.4                 
##  [71] data.table_1.14.8             hms_1.1.3                    
##  [73] metapod_1.10.0                BiocSingular_1.18.0          
##  [75] ScaledMatrix_1.10.0           xml2_1.3.5                   
##  [77] utf8_1.2.4                    XVector_0.42.0               
##  [79] ggrepel_0.9.4                 BiocVersion_3.18.0           
##  [81] pillar_1.9.0                  stringr_1.5.0                
##  [83] limma_3.58.0                  later_1.3.1                  
##  [85] dplyr_1.1.3                   BiocFileCache_2.10.0         
##  [87] lattice_0.22-5                rtracklayer_1.62.0           
##  [89] bit_4.0.5                     tidyselect_1.2.0             
##  [91] locfit_1.5-9.8                Biostrings_2.70.0            
##  [93] knitr_1.44                    gridExtra_2.3                
##  [95] bookdown_0.36                 ProtGenerics_1.34.0          
##  [97] edgeR_4.0.0                   xfun_0.40                    
##  [99] statmod_1.5.0                 stringi_1.7.12               
## [101] lazyeval_0.2.2                yaml_2.3.7                   
## [103] evaluate_0.22                 codetools_0.2-19             
## [105] tibble_3.2.1                  BiocManager_1.30.22          
## [107] cli_3.6.1                     xtable_1.8-4                 
## [109] munsell_0.5.0                 jquerylib_0.1.4              
## [111] Rcpp_1.0.11                   dbplyr_2.3.4                 
## [113] png_0.1-8                     XML_3.99-0.14                
## [115] parallel_4.3.1                ellipsis_0.3.2               
## [117] blob_1.2.4                    prettyunits_1.2.0            
## [119] sparseMatrixStats_1.14.0      bitops_1.0-7                 
## [121] viridisLite_0.4.2             scales_1.2.1                 
## [123] purrr_1.0.2                   crayon_1.5.2                 
## [125] rlang_1.1.1                   cowplot_1.1.1                
## [127] KEGGREST_1.42.0