dreamlet()
evaluates precision-weighted linear (mixed) models on each gene that passes standard filters. The linear mixed model used by dream()
can be a little fragile for small sample sizes and correlated covariates. dreamlet()
runs variancePartition::dream()
in the backend for each cell cluster. dream()
reports model failures for each cell cluster and dreamlet()
reports these failures to the user. dreamlet()
returns all successful model fits to be used for downstream analysis.
See details from variancePartition
error page.
Due to a recent bug in the dependency Matrix
package, all random effects models may fail for technical reasons. If your random effects analysis is failing for all genes in cases with no good explanation, this bug may be responsible. This case can be detected and resolved as follows:
library(lme4)
# Fit simple mixed model
lmer(Reaction ~ (1 | Subject), sleepstudy)
# Error in initializePtr() :
# function 'chm_factor_ldetL2' not provided by package 'Matrix'
This error indicates incompatible installs of Matrix
and lme4
. This can be solved with
install.packages("lme4", type = "source")
followed by restarting R.
The most common issue is when dreamlet()
analysis succeeds for most genes, but a handful of genes fail in each cell cluster. These genes can fail if the iterative process of fitting the linear mixed model does not converge, or if the estimated covariance matrix that is supposed be positive definite has an eigen-value that is negative or too close to zero due to rounding errors in floating point arithmetic.
In these cases, dreamlet()
stores a summary of these failures for all cell clusters that is accessible with details()
. Specific failure messages for each cell cluster and gene can be extracted using seeErrors()
Here we demonstrate how dreamlet()
handles model failures:
library(dreamlet)
library(muscat)
library(SingleCellExperiment)
data(example_sce)
# create pseudobulk for each sample and cell cluster
pb <- aggregateToPseudoBulk(example_sce,
assay = "counts",
cluster_id = "cluster_id",
sample_id = "sample_id",
verbose = FALSE
)
# voom-style normalization for each cell cluster
res.proc <- processAssays(
pb[1:300, ],
~group_id
)
# Redundant formula
# This example is an extreme example of redundancy
# but more subtle cases often show up in real data
form <- ~ group_id + (1 | group_id)
# fit dreamlet model
res.dl <- dreamlet(res.proc, form)
## B cells...7.9 secs
## CD14+ Monocytes...10 secs
## CD4 T cells...9 secs
## CD8 T cells...4.4 secs
## FCGR3A+ Monocytes...11 secs
##
## Of 1,062 models fit across all assays, 96.2% failed
# summary of models
res.dl
## class: dreamletResult
## assays(5): B cells CD14+ Monocytes CD4 T cells CD8 T cells FCGR3A+ Monocytes
## Genes:
## min: 3
## max: 11
## details(7): assay n_retain ... n_errors error_initial
## coefNames(2): (Intercept) group_idstim
##
## Of 1,062 models fit across all assays, 96.2% failed
# summary of models for each cell cluster
details(res.dl)
## assay n_retain formula formDropsTerms n_genes n_errors error_initial
## 1 B cells 4 ~group_id + (1 | group_id) FALSE 201 190 FALSE
## 2 CD14+ Monocytes 4 ~group_id + (1 | group_id) FALSE 269 263 FALSE
## 3 CD4 T cells 4 ~group_id + (1 | group_id) FALSE 216 207 FALSE
## 4 CD8 T cells 4 ~group_id + (1 | group_id) FALSE 118 115 FALSE
## 5 FCGR3A+ Monocytes 4 ~group_id + (1 | group_id) FALSE 258 247 FALSE
assay
: cell typen_retain
: number of samples retainedformula
: regression formula used after variable filteringformDropsTerms
: whether a variable was dropped from the formula for having zero variance following filteringn_genes
: number of genes analyzedn_errors
: number of genes with errorserror_initial
: indicator for assay-level errorBefore the full dataset is analyzed, dreamlet()
runs a test for each assay to see if the model succeeds. If the model fails, its does not continue analysis for that assay. These assay-level errors are reported above in the error_initial
column, and details are returned here.
# Extract errors as a tibble
res.err = seeErrors(res.dl)
## Assay-level errors: 0
## Gene-level errors: 1038
# No errors at the assay level
res.err$assayLevel
# the most common error is:
"Some predictor variables are on very different scales: consider rescaling"
This indicates that the scale of the predictor variables are very different and can affect the numerical stability of the iterative algorithm. This can be solved by running scale()
on each variable in the formula:
form = ~ scale(x) + scale(y) + ...
A model can fail for a single gene if covariates are too correlated, or for other numerical issues. Failed models are reported here and are not included in downstream analysis.
# See gene-level errors for each assay
res.err$geneLevel[1:2,]
## # A tibble: 2 × 3
## assay feature errorText
## <chr> <chr> <chr>
## B cells ISG15 "Error in lmerTest:::as_lmerModLT(model, devfun, tol = tol):…
## B cells AURKAIP1 "Error in lmerTest:::as_lmerModLT(model, devfun, tol = tol):…
# See full error message text
res.err$geneLevel$errorText[1]
"Error in lmerTest:::as_lmerModLT(model, devfun, tol = tol): (converted from warning)
Model may not have converged with 1 eigenvalue close to zero: 1.4e-09\n"
This message indicates that the model was numerically unstable likely because the variables are closely correlated.
## R version 4.3.2 Patched (2023-11-13 r85521)
## 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] GO.db_3.18.0 org.Hs.eg.db_3.18.0
## [3] AnnotationDbi_1.64.1 zenith_1.4.2
## [5] muscData_1.16.0 scater_1.30.1
## [7] scuttle_1.12.0 ExperimentHub_2.10.0
## [9] AnnotationHub_3.10.0 BiocFileCache_2.10.1
## [11] dbplyr_2.4.0 muscat_1.16.0
## [13] dreamlet_1.0.3 SingleCellExperiment_1.24.0
## [15] SummarizedExperiment_1.32.0 Biobase_2.62.0
## [17] GenomicRanges_1.54.1 GenomeInfoDb_1.38.6
## [19] IRanges_2.36.0 S4Vectors_0.40.2
## [21] BiocGenerics_0.48.1 MatrixGenerics_1.14.0
## [23] matrixStats_1.2.0 variancePartition_1.32.5
## [25] BiocParallel_1.36.0 limma_3.58.1
## [27] ggplot2_3.5.0 BiocStyle_2.30.0
##
## loaded via a namespace (and not attached):
## [1] bitops_1.0-7 httr_1.4.7
## [3] RColorBrewer_1.1-3 doParallel_1.0.17
## [5] Rgraphviz_2.46.0 numDeriv_2016.8-1.1
## [7] tools_4.3.2 sctransform_0.4.1
## [9] backports_1.4.1 utf8_1.2.4
## [11] R6_2.5.1 metafor_4.4-0
## [13] mgcv_1.9-1 GetoptLong_1.0.5
## [15] withr_3.0.0 prettyunits_1.2.0
## [17] gridExtra_2.3 cli_3.6.2
## [19] sandwich_3.1-0 labeling_0.4.3
## [21] sass_0.4.8 KEGGgraph_1.62.0
## [23] SQUAREM_2021.1 mvtnorm_1.2-4
## [25] blme_1.0-5 mixsqp_0.3-54
## [27] parallelly_1.37.0 invgamma_1.1
## [29] RSQLite_2.3.5 generics_0.1.3
## [31] shape_1.4.6.1 gtools_3.9.5
## [33] dplyr_1.1.4 Matrix_1.6-5
## [35] metadat_1.2-0 ggbeeswarm_0.7.2
## [37] fansi_1.0.6 abind_1.4-5
## [39] lifecycle_1.0.4 multcomp_1.4-25
## [41] yaml_2.3.8 edgeR_4.0.16
## [43] mathjaxr_1.6-0 gplots_3.1.3.1
## [45] SparseArray_1.2.4 grid_4.3.2
## [47] blob_1.2.4 promises_1.2.1
## [49] crayon_1.5.2 lattice_0.22-5
## [51] beachmat_2.18.1 msigdbr_7.5.1
## [53] annotate_1.80.0 KEGGREST_1.42.0
## [55] magick_2.8.3 pillar_1.9.0
## [57] knitr_1.45 ComplexHeatmap_2.18.0
## [59] rjson_0.2.21 boot_1.3-30
## [61] estimability_1.5 corpcor_1.6.10
## [63] future.apply_1.11.1 codetools_0.2-19
## [65] glue_1.7.0 data.table_1.15.0
## [67] vctrs_0.6.5 png_0.1-8
## [69] Rdpack_2.6 gtable_0.3.4
## [71] assertthat_0.2.1 cachem_1.0.8
## [73] xfun_0.42 mime_0.12
## [75] rbibutils_2.2.16 S4Arrays_1.2.0
## [77] Rfast_2.1.0 coda_0.19-4.1
## [79] survival_3.5-8 iterators_1.0.14
## [81] statmod_1.5.0 ellipsis_0.3.2
## [83] interactiveDisplayBase_1.40.0 TH.data_1.1-2
## [85] nlme_3.1-164 pbkrtest_0.5.2
## [87] bit64_4.0.5 filelock_1.0.3
## [89] progress_1.2.3 EnvStats_2.8.1
## [91] bslib_0.6.1 TMB_1.9.10
## [93] irlba_2.3.5.1 vipor_0.4.7
## [95] KernSmooth_2.23-22 colorspace_2.1-0
## [97] rmeta_3.0 DBI_1.2.2
## [99] DESeq2_1.42.0 tidyselect_1.2.0
## [101] emmeans_1.10.0 curl_5.2.0
## [103] bit_4.0.5 compiler_4.3.2
## [105] graph_1.80.0 BiocNeighbors_1.20.2
## [107] DelayedArray_0.28.0 bookdown_0.37
## [109] scales_1.3.0 caTools_1.18.2
## [111] remaCor_0.0.18 rappdirs_0.3.3
## [113] stringr_1.5.1 digest_0.6.34
## [115] minqa_1.2.6 rmarkdown_2.25
## [117] aod_1.3.3 XVector_0.42.0
## [119] RhpcBLASctl_0.23-42 htmltools_0.5.7
## [121] pkgconfig_2.0.3 lme4_1.1-35.1
## [123] sparseMatrixStats_1.14.0 highr_0.10
## [125] mashr_0.2.79 fastmap_1.1.1
## [127] rlang_1.1.3 GlobalOptions_0.1.2
## [129] shiny_1.8.0 DelayedMatrixStats_1.24.0
## [131] farver_2.1.1 jquerylib_0.1.4
## [133] zoo_1.8-12 jsonlite_1.8.8
## [135] BiocSingular_1.18.0 RCurl_1.98-1.14
## [137] magrittr_2.0.3 GenomeInfoDbData_1.2.11
## [139] munsell_0.5.0 Rcpp_1.0.12
## [141] babelgene_22.9 viridis_0.6.5
## [143] EnrichmentBrowser_2.32.0 RcppZiggurat_0.1.6
## [145] stringi_1.8.3 zlibbioc_1.48.0
## [147] MASS_7.3-60.0.1 plyr_1.8.9
## [149] listenv_0.9.1 parallel_4.3.2
## [151] ggrepel_0.9.5 Biostrings_2.70.2
## [153] splines_4.3.2 hms_1.1.3
## [155] circlize_0.4.16 locfit_1.5-9.8
## [157] reshape2_1.4.4 ScaledMatrix_1.10.0
## [159] BiocVersion_3.18.1 XML_3.99-0.16.1
## [161] evaluate_0.23 RcppParallel_5.1.7
## [163] BiocManager_1.30.22 httpuv_1.6.14
## [165] nloptr_2.0.3 foreach_1.5.2
## [167] tidyr_1.3.1 purrr_1.0.2
## [169] future_1.33.1 clue_0.3-65
## [171] scattermore_1.2 ashr_2.2-63
## [173] rsvd_1.0.5 broom_1.0.5
## [175] xtable_1.8-4 fANCOVA_0.6-1
## [177] later_1.3.2 viridisLite_0.4.2
## [179] truncnorm_1.0-9 tibble_3.2.1
## [181] lmerTest_3.1-3 glmmTMB_1.1.8
## [183] memoise_2.0.1 beeswarm_0.4.0
## [185] cluster_2.1.6 globals_0.16.2
## [187] GSEABase_1.64.0