In the MOFA2 R package we provide a wide range of downstream analysis to visualise and interpret the model output. Here we provide a brief description of the main functionalities. This vignette is made of simulated data and we do not highlight biologically relevant results. Please see our tutorials for real use cases.
library(ggplot2)
library(MOFA2)
filepath <- system.file("extdata", "model.hdf5", package = "MOFA2")
model <- load_model(filepath)
The function plot_data_overview
can be used to obtain an overview of the input data.
It shows how many views (rows) and how many groups (columns) exist, what are
their corresponding dimensionalities and how many missing information they have (grey bars).
plot_data_overview(model)
The metadata is stored as a data.frame object in model@samples_metadata
,
and it requires at least the column sample
.
The column group
is required only if you are doing multi-group inference.
The number of rows must match the total number of samples
in the model (sum(model@dimensions$N)
).
Let’s add some artificial metadata…
Nsamples = sum(get_dimensions(model)[["N"]])
sample_metadata <- data.frame(
sample = samples_names(model)[[1]],
condition = sample(c("A","B"), size = Nsamples, replace = TRUE),
age = sample(1:100, size = Nsamples, replace = TRUE)
)
samples_metadata(model) <- sample_metadata
head(samples_metadata(model), n=3)
## sample condition age group
## 1 sample_0_group_1 B 31 single_group
## 2 sample_1_group_1 B 70 single_group
## 3 sample_2_group_1 A 79 single_group
The first step in the MOFA analysis is to quantify the amount
of variance explained (\(R^2\)) by each factor in each data modality.
The variance explained estimates are stored in the hdf5 file and
loaded in model@cache[["variance_explained"]]
:
# Total variance explained per view
head(get_variance_explained(model)$r2_total[[1]])
## view_0 view_1
## 76.20973 76.97777
# Variance explained for every factor in per view
head(get_variance_explained(model)$r2_per_factor[[1]])
## view_0 view_1
## Factor1 19.20399955 19.41070871
## Factor2 15.47560732 17.94710458
## Factor3 16.47469843 16.48996544
## Factor4 13.42094721 11.09844071
## Factor5 11.76334520 11.82572116
## Factor6 0.03885712 0.07087386
Variance explained estimates can be plotted using plot_variance_explained(model, ...)
. Options:
In this case we have 5 active factors that explain a large amount of variation in both data modalities.
plot_variance_explained(model, x="view", y="factor")
The model explains ~70% of the variance in both data modalities.
plot_variance_explained(model, x="view", y="factor", plot_total = TRUE)[[2]]
The MOFA factors capture the global sources of variability in the data. Mathematically, each factor ordinates cells along a one-dimensional axis centered at zero. The value per se is not important, only the relative positioning of samples matters. Samples with different signs manifest opposite “effects” along the inferred axis of variation, with higher absolute value indicating a stronger effect. Note that the interpretation of factors is analogous to the interpretation of the principal components in PCA.
Factors can be plotted using plot_factor
(for beeswarm plots of individual factors) or
plot_factors
(for scatter plots of factor combinations).
plot_factor(model,
factor = 1:3,
color_by = "age",
shape_by = "condition"
)
Adding more options
p <- plot_factor(model,
factors = c(1,2,3),
color_by = "condition",
dot_size = 3, # change dot size
dodge = TRUE, # dodge points with different colors
legend = FALSE, # remove legend
add_violin = TRUE, # add violin plots,
violin_alpha = 0.25 # transparency of violin plots
)
# The output of plot_factor is a ggplot2 object that we can edit
p <- p +
scale_color_manual(values=c("A"="black", "B"="red")) +
scale_fill_manual(values=c("A"="black", "B"="red"))
print(p)
Scatter plots
plot_factors(model,
factors = 1:3,
color_by = "condition"
)
The weights provide a score for how strong each feature relates to each factor. Features with no association with the factor have values close to zero, while features with strong association with the factor have large absolute values. The sign of the weight indicates the direction of the effect: a positive weight indicates that the feature has higher levels in the cells with positive factor values, and vice versa.
Weights can be plotted using plot_weights
or plot_top_weights
plot_weights(model,
view = "view_0",
factor = 1,
nfeatures = 10, # Number of features to highlight
scale = TRUE, # Scale weights from -1 to 1
abs = FALSE # Take the absolute value?
)
plot_top_weights(model,
view = "view_0",
factor = 1,
nfeatures = 10
)
Instead of looking at weights, it is useful to observe the coordinated heterogeneity
that MOFA captures in the original data.
This can be done using the plot_data_heatmap
and plot_data_scatter
function.
Heatmap of observations. Top features are selected by its weight in the selected factor. By default, samples are ordered according to their corresponding factor value.
plot_data_heatmap(model,
view = "view_1", # view of interest
factor = 1, # factor of interest
features = 20, # number of features to plot (they are selected by weight)
# extra arguments that are passed to the `pheatmap` function
cluster_rows = TRUE, cluster_cols = FALSE,
show_rownames = TRUE, show_colnames = FALSE
)
Scatter plots of observations vs factor values. It is useful to add a linear regression estimate to visualise if the relationship between (top) features and factor values is linear.
plot_data_scatter(model,
view = "view_1", # view of interest
factor = 1, # factor of interest
features = 5, # number of features to plot (they are selected by weight)
add_lm = TRUE, # add linear regression
color_by = "condition"
)
The MOFA factors are linear (as in Principal Component analysis), so each one captures limited amount of information, but they can be used as input to other methods that learn compact nonlinear manifolds, e.g. t-SNE or UMAP.
Run UMAP or t-SNE
set.seed(42)
model <- run_umap(model)
model <- run_tsne(model)
Plot (nothing too interesting in this simulated data set)
plot_dimred(model,
method = "TSNE", # method can be either "TSNE" or "UMAP"
color_by = "condition",
dot_size = 5
)
## Warning: `guides(<scale> = FALSE)` is deprecated. Please use `guides(<scale> =
## "none")` instead.
The user can rename the dimensions of the model
views_names(model) <- c("Transcriptomics", "Proteomics")
factors_names(model) <- paste("Factor", 1:get_dimensions(model)$K, sep=" ")
views_names(model)
## [1] "Transcriptomics" "Proteomics"
The user can extract the feature weights, the data and the factors to generate their own plots.
Extract factors
# "factors" is a list of matrices, one matrix per group with dimensions (nsamples, nfactors)
factors <- get_factors(model, factors = "all")
lapply(factors,dim)
## $single_group
## [1] 100 10
Extract weights
# "weights" is a list of matrices, one matrix per view with dimensions (nfeatures, nfactors)
weights <- get_weights(model, views = "all", factors = "all")
lapply(weights,dim)
## $Transcriptomics
## [1] 1000 10
##
## $Proteomics
## [1] 1000 10
Extract data
# "data" is a nested list of matrices, one matrix per view and group with dimensions (nfeatures, nsamples)
data <- get_data(model)
lapply(data, function(x) lapply(x, dim))[[1]]
## $single_group
## [1] 1000 100
For convenience, the user can extract the data in long data.frame format:
factors <- get_factors(model, as.data.frame = TRUE)
head(factors, n=3)
## sample factor value group
## 1 sample_0_group_1 Factor 1 -2.0102648 single_group
## 2 sample_1_group_1 Factor 1 0.2251219 single_group
## 3 sample_2_group_1 Factor 1 -0.2968025 single_group
weights <- get_weights(model, as.data.frame = TRUE)
head(weights, n=3)
## feature factor value view
## 1 feature_0_view_0 Factor 1 -0.002225892 Transcriptomics
## 2 feature_1_view_0 Factor 1 -0.353517945 Transcriptomics
## 3 feature_2_view_0 Factor 1 0.016938729 Transcriptomics
data <- get_data(model, as.data.frame = TRUE)
head(data, n=3)
## view group feature sample value
## 1 Transcriptomics single_group feature_0_view_0 sample_0_group_1 2.08
## 2 Transcriptomics single_group feature_1_view_0 sample_0_group_1 1.10
## 3 Transcriptomics single_group feature_2_view_0 sample_0_group_1 -2.50
Session Info
sessionInfo()
## R version 4.2.1 (2022-06-23)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.5 LTS
##
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.16-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.16-bioc/R/lib/libRlapack.so
##
## 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
##
## attached base packages:
## [1] stats graphics grDevices utils datasets methods base
##
## other attached packages:
## [1] pheatmap_1.0.12 forcats_0.5.2 stringr_1.4.1 dplyr_1.0.10
## [5] purrr_0.3.5 readr_2.1.3 tidyr_1.2.1 tibble_3.1.8
## [9] ggplot2_3.3.6 tidyverse_1.3.2 MOFA2_1.8.0 BiocStyle_2.26.0
##
## loaded via a namespace (and not attached):
## [1] googledrive_2.0.0 Rtsne_0.16 colorspace_2.0-3
## [4] ggsignif_0.6.4 ellipsis_0.3.2 rprojroot_2.0.3
## [7] fs_1.5.2 ggpubr_0.4.0 farver_2.1.1
## [10] ggrepel_0.9.1 fansi_1.0.3 mvtnorm_1.1-3
## [13] lubridate_1.8.0 xml2_1.3.3 codetools_0.2-18
## [16] splines_4.2.1 cachem_1.0.6 knitr_1.40
## [19] jsonlite_1.8.3 broom_1.0.1 dbplyr_2.2.1
## [22] png_0.1-7 uwot_0.1.14 HDF5Array_1.26.0
## [25] BiocManager_1.30.19 compiler_4.2.1 httr_1.4.4
## [28] basilisk_1.10.0 backports_1.4.1 assertthat_0.2.1
## [31] Matrix_1.5-1 fastmap_1.1.0 gargle_1.2.1
## [34] cli_3.4.1 htmltools_0.5.3 tools_4.2.1
## [37] gtable_0.3.1 glue_1.6.2 reshape2_1.4.4
## [40] Rcpp_1.0.9 carData_3.0-5 cellranger_1.1.0
## [43] jquerylib_0.1.4 vctrs_0.5.0 rhdf5filters_1.10.0
## [46] nlme_3.1-160 xfun_0.34 rvest_1.0.3
## [49] irlba_2.3.5.1 lifecycle_1.0.3 rstatix_0.7.0
## [52] googlesheets4_1.0.1 scales_1.2.1 basilisk.utils_1.10.0
## [55] hms_1.1.2 MatrixGenerics_1.10.0 parallel_4.2.1
## [58] rhdf5_2.42.0 RColorBrewer_1.1-3 yaml_2.3.6
## [61] reticulate_1.26 sass_0.4.2 reshape_0.8.9
## [64] stringi_1.7.8 highr_0.9 S4Vectors_0.36.0
## [67] corrplot_0.92 BiocGenerics_0.44.0 filelock_1.0.2
## [70] rlang_1.0.6 pkgconfig_2.0.3 matrixStats_0.62.0
## [73] evaluate_0.17 lattice_0.20-45 Rhdf5lib_1.20.0
## [76] labeling_0.4.2 cowplot_1.1.1 tidyselect_1.2.0
## [79] RcppAnnoy_0.0.20 here_1.0.1 GGally_2.1.2
## [82] plyr_1.8.7 magrittr_2.0.3 bookdown_0.29
## [85] R6_2.5.1 IRanges_2.32.0 magick_2.7.3
## [88] generics_0.1.3 DelayedArray_0.24.0 DBI_1.1.3
## [91] mgcv_1.8-41 pillar_1.8.1 haven_2.5.1
## [94] withr_2.5.0 abind_1.4-5 dir.expiry_1.6.0
## [97] modelr_0.1.9 crayon_1.5.2 car_3.1-1
## [100] utf8_1.2.2 tzdb_0.3.0 rmarkdown_2.17
## [103] grid_4.2.1 readxl_1.4.1 reprex_2.0.2
## [106] digest_0.6.30 stats4_4.2.1 munsell_0.5.0
## [109] bslib_0.4.0