scDblFinder 1.23.0
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 1000 cells for speed.
library(scRNAseq)
sce <- BachMammaryData(samples="G_1")
set.seed(1001)
sce <- sce[,sample(ncol(sce), 1000)]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)
hvgs <- getTopHVGs(dec, n=1000)
library(scater)
set.seed(1002)
sce <- runPCA(sce, ncomponents=10, subset_row=hvgs)
sce <- runTSNE(sce, dimred="PCA")We run computeDoubletDensity() to obtain a doublet score for each cell based on the density of simulated doublets around it.
We log this to get some better dynamic range.
set.seed(1003)
library(scDblFinder)
scores <- computeDoubletDensity(sce, subset.row=hvgs)
plotTSNE(sce, colour_by=I(log1p(scores)))We use a fairly simple approach in doubletCells that involves creating simulated doublets from the original data set:
We allow specification of two sets of size factors for different purposes. The first set is the normalization set: division of counts by these size factors yields expression values to be compared across cells. This is necessary to compute log-normalized expression values for the PCA.
These size factors are usually computed from some method that assumes most genes are not DE. We default to library size normalization though any arbitrary set of size factors can be used. The size factor for each doublet is computed as the sum of size factors for the individual cells, based on the additivity of scaling biases.
The second set is the RNA content set: division of counts by these size factors yields expression values that are proportional to absolute abundance across cells. This affects the creation of simulated doublets by controlling the scaling of the count profiles for the individual cells. These size factors would normally be estimated with spike-ins, but in their absence we default to using unity for all cells.
The use of unity values implies that the library size for each cell is a good proxy for total RNA content. This is unlikely to be true: technical biases mean that the library size is an imprecise relative estimate of the content. Saturation effects and composition biases also mean that the expected library size for each population is not an accurate estimate of content. The imprecision will spread out the simulated doublets while the inaccuracy will result in a systematic shift from the location of true doublets.
Arguably, such problems exist for any doublet estimation method without spike-in information. We can only hope that the inaccuracies have only minor effects on the creation of simulated cells. Indeed, the first effect does mitigate the second to some extent by ensuring that some simulated doublets will occupy the neighbourhood of the true doublets.
These two sets of size factors play different roles so it is possible to specify both of them. We use the following algorithm to accommodate non-unity values for the RNA content size factors:
To understand the correctness of the rescaled normalization size factors, consider a non-DE gene with abundance \(\lambda_g\). The expected count in each cell is \(\lambda_g s_i\) for scaling bias \(s_i\) (i.e., normalization size factor). The rescaled count is \(\lambda_g s_i c_i^{-1}\) for some RNA content size factor \(c_i\). The rescaled normalization size factor is \(s_i c_i^{-1}\), such that normalization yields \(\lambda_g\) as desired. This also holds for doublets where the scaling biases and size factors are additive.
We assume that the simulation accurately mimics doublet creation - amongst other things, we assume that doublets are equally likely to form between any cell populations and any differences in total RNA between subpopulations are captured or negligible. If these assumptions hold, then at any given region in the expression space, the number of doublets among the real cells is proportional to the number of simulated doublets lying in the same region. Thus, the probability that a cell is a doublet is proportional to the ratio of the number of neighboring simulated doublets to the number of neighboring real cells.
A mild additional challenge here is that the number of simulated cells \(N_s\) can vary. Ideally, we would like the expected output of the function to be the same regardless of the user’s choice of \(N_s\), i.e., the chosen value should only affect the precision/speed trade-off. Many other doublet-based methods take a \(k\)-nearest neighbours approach to compute densities; but if \(N_s\) is too large relative to the number of real cells, all of the \(k\) nearest neighbours will be simulated, while if \(N_s\) is too small, all of the nearest neighbors will be original cells.
Thus, we use a modified version of the \(k\)NN approach whereby we identify the distance from each cell to its \(k\)-th nearest neighbor. This defines a hypersphere around that cell in which we count the number of simulated cells. We then compute the odds ratio of the number of simulated cells in the hypersphere to \(N_s\), divided by the ratio of \(k\) to the total number of cells in the dataset. This score captures the relative frequency of simulated cells to real cells while being robust to changes to \(N_s\).
sessionInfo()## R version 4.5.0 Patched (2025-04-21 r88169)
## Platform: x86_64-apple-darwin20
## Running under: macOS Monterey 12.7.6
## 
## Matrix products: default
## BLAS:   /Library/Frameworks/R.framework/Versions/4.5-x86_64/Resources/lib/libRblas.0.dylib 
## LAPACK: /Library/Frameworks/R.framework/Versions/4.5-x86_64/Resources/lib/libRlapack.dylib;  LAPACK version 3.12.1
## 
## locale:
## [1] C/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
## 
## time zone: America/New_York
## tzcode source: internal
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] bluster_1.19.0              scDblFinder_1.23.0         
##  [3] scater_1.37.0               ggplot2_3.5.2              
##  [5] scran_1.37.0                scuttle_1.19.0             
##  [7] ensembldb_2.33.0            AnnotationFilter_1.33.0    
##  [9] GenomicFeatures_1.61.0      AnnotationDbi_1.71.0       
## [11] scRNAseq_2.23.0             SingleCellExperiment_1.31.0
## [13] SummarizedExperiment_1.39.0 Biobase_2.69.0             
## [15] GenomicRanges_1.61.0        GenomeInfoDb_1.45.0        
## [17] IRanges_2.43.0              S4Vectors_0.47.0           
## [19] BiocGenerics_0.55.0         generics_0.1.3             
## [21] MatrixGenerics_1.21.0       matrixStats_1.5.0          
## [23] BiocStyle_2.37.0           
## 
## loaded via a namespace (and not attached):
##   [1] jsonlite_2.0.0           magrittr_2.0.3           magick_2.8.6            
##   [4] ggbeeswarm_0.7.2         gypsum_1.5.0             farver_2.1.2            
##   [7] rmarkdown_2.29           BiocIO_1.19.0            vctrs_0.6.5             
##  [10] memoise_2.0.1            Rsamtools_2.25.0         RCurl_1.98-1.17         
##  [13] tinytex_0.57             htmltools_0.5.8.1        S4Arrays_1.9.0          
##  [16] AnnotationHub_3.99.0     curl_6.2.2               BiocNeighbors_2.3.0     
##  [19] xgboost_1.7.10.1         Rhdf5lib_1.31.0          SparseArray_1.9.0       
##  [22] rhdf5_2.53.0             sass_0.4.10              alabaster.base_1.9.0    
##  [25] bslib_0.9.0              alabaster.sce_1.9.0      httr2_1.1.2             
##  [28] cachem_1.1.0             GenomicAlignments_1.45.0 igraph_2.1.4            
##  [31] lifecycle_1.0.4          pkgconfig_2.0.3          rsvd_1.0.5              
##  [34] Matrix_1.7-3             R6_2.6.1                 fastmap_1.2.0           
##  [37] GenomeInfoDbData_1.2.14  digest_0.6.37            colorspace_2.1-1        
##  [40] dqrng_0.4.1              irlba_2.3.5.1            ExperimentHub_2.99.0    
##  [43] RSQLite_2.3.9            beachmat_2.25.0          labeling_0.4.3          
##  [46] filelock_1.0.3           httr_1.4.7               abind_1.4-8             
##  [49] compiler_4.5.0           bit64_4.6.0-1            withr_3.0.2             
##  [52] BiocParallel_1.43.0      viridis_0.6.5            DBI_1.2.3               
##  [55] HDF5Array_1.37.0         alabaster.ranges_1.9.0   alabaster.schemas_1.9.0 
##  [58] MASS_7.3-65              rappdirs_0.3.3           DelayedArray_0.35.1     
##  [61] rjson_0.2.23             tools_4.5.0              vipor_0.4.7             
##  [64] beeswarm_0.4.0           glue_1.8.0               h5mread_1.1.0           
##  [67] restfulr_0.0.15          rhdf5filters_1.21.0      grid_4.5.0              
##  [70] Rtsne_0.17               cluster_2.1.8.1          gtable_0.3.6            
##  [73] data.table_1.17.0        BiocSingular_1.25.0      ScaledMatrix_1.17.0     
##  [76] metapod_1.17.0           XVector_0.49.0           ggrepel_0.9.6           
##  [79] BiocVersion_3.22.0       pillar_1.10.2            limma_3.65.0            
##  [82] dplyr_1.1.4              BiocFileCache_2.99.0     lattice_0.22-7          
##  [85] rtracklayer_1.69.0       bit_4.6.0                tidyselect_1.2.1        
##  [88] locfit_1.5-9.12          Biostrings_2.77.0        knitr_1.50              
##  [91] gridExtra_2.3            bookdown_0.43            ProtGenerics_1.41.0     
##  [94] edgeR_4.7.0              xfun_0.52                statmod_1.5.0           
##  [97] UCSC.utils_1.5.0         lazyeval_0.2.2           yaml_2.3.10             
## [100] evaluate_1.0.3           codetools_0.2-20         tibble_3.2.1            
## [103] alabaster.matrix_1.9.0   BiocManager_1.30.25      cli_3.6.5               
## [106] munsell_0.5.1            jquerylib_0.1.4          Rcpp_1.0.14             
## [109] dbplyr_2.5.0             png_0.1-8                XML_3.99-0.18           
## [112] parallel_4.5.0           blob_1.2.4               bitops_1.0-9            
## [115] viridisLite_0.4.2        alabaster.se_1.9.0       scales_1.3.0            
## [118] purrr_1.0.4              crayon_1.5.3             rlang_1.1.6             
## [121] cowplot_1.1.3            KEGGREST_1.49.0