This vignette contains a detailed tutorial on how to train a MOFA model using R. A concise template script can be found here. Many more examples on application of MOFA to various multi-omics data sets can be found here.
library(data.table)
library(MOFA2)MOFA (and factor analysis models in general) are useful to uncover variation in complex data sets that contain multiple sources of heterogeneity. This requires a relatively large sample size (at least ~15 samples). In addition, MOFA needs the multi-modal measurements to be derived from the same samples. It is fine if you have samples that are missing some data modality, but there has to be a significant degree of matched measurements.
Proper normalisation of the data is critical. The model can handle three types of data: continuous (modelled with a gaussian likelihood), small counts (modelled with a Poisson likelihood) and binary measurements (modelled with a bernoulli likelihood). Non-gaussian likelihoods give non-optimal results, we recommend the user to apply data transformations to obtain continuous measurements. For example, for count-based data such as RNA-seq or ATAC-seq we recommend size factor normalisation + variance stabilisation (i.e. a log transformation).
It is strongly recommended that you select highly variable features (HVGs) per assay before fitting the model. This ensures a faster training and a more robust inference procedure. Also, for data modalities that have very different dimensionalities we suggest a stronger feature selection fort he bigger views, with the aim of reducing the feature imbalance between data modalities.
To create a MOFA object you need to specify three dimensions: samples, features and view(s). Optionally, a group can also be specified for each sample (no group structure by default). MOFA objects can be created from a wide range of input formats, including:
A list of matrices, where each entry corresponds to one view. Samples are stored in columns and features in rows.
Let’s simulate some data to start with
data <- make_example_data(
  n_views = 2, 
  n_samples = 200, 
  n_features = 1000, 
  n_factors = 10
)[[1]]
lapply(data,dim)## $view_1
## [1] 1000  200
## 
## $view_2
## [1] 1000  200Create the MOFA object:
MOFAobject <- create_mofa(data)Plot the data overview
plot_data_overview(MOFAobject)In case you are using the multi-group functionality, the groups can be specified
using the groups argument as a vector with the group ID for each sample.
Keep in mind that the multi-group functionality is a rather advanced option that we
discourage for beginners. For more details on how the multi-group inference works,
read the FAQ section and
check this vignette.
N = ncol(data[[1]])
groups = c(rep("A",N/2), rep("B",N/2))
MOFAobject <- create_mofa(data, groups=groups)Plot the data overview
plot_data_overview(MOFAobject)A long data.frame with columns sample, feature, view, group (optional), value
might be the best format for complex data sets with multiple omics and potentially multiple groups of data. Also, there is no need to add rows that correspond to missing data:
filepath <- system.file("extdata", "test_data.RData", package = "MOFA2")
load(filepath)
head(dt)##              sample          feature   view value
## 1: sample_0_group_1 feature_0_view_0 view_0  2.08
## 2: sample_1_group_1 feature_0_view_0 view_0  0.01
## 3: sample_2_group_1 feature_0_view_0 view_0 -0.11
## 4: sample_3_group_1 feature_0_view_0 view_0 -0.82
## 5: sample_4_group_1 feature_0_view_0 view_0 -1.13
## 6: sample_5_group_1 feature_0_view_0 view_0 -0.25Create the MOFA object
MOFAobject <- create_mofa(dt)## Creating MOFA object from a data.frame...print(MOFAobject)## Untrained MOFA model with the following characteristics: 
##  Number of views: 2 
##  Views names: view_0 view_1 
##  Number of features (per view): 1000 1000 
##  Number of groups: 1 
##  Groups names: single_group 
##  Number of samples (per group): 100Plot data overview
plot_data_overview(MOFAobject)FALSEFALSEdata_opts <- get_default_data_options(MOFAobject)
head(data_opts)## $scale_views
## [1] FALSE
## 
## $scale_groups
## [1] FALSE
## 
## $views
## [1] "view_0" "view_1"
## 
## $groups
## [1] "single_group"FALSE.TRUE.TRUE if using multiple groups.TRUE if using multiple views.Only change the default model options if you are familiar with the underlying mathematical model.
model_opts <- get_default_model_options(MOFAobject)
model_opts$num_factors <- 10
head(model_opts)## $likelihoods
##     view_0     view_1 
## "gaussian" "gaussian" 
## 
## $num_factors
## [1] 10
## 
## $spikeslab_factors
## [1] FALSE
## 
## $spikeslab_weights
## [1] TRUE
## 
## $ard_factors
## [1] FALSE
## 
## $ard_weights
## [1] TRUEtrain_opts <- get_default_training_options(MOFAobject)
head(train_opts)## $maxiter
## [1] 1000
## 
## $convergence_mode
## [1] "fast"
## 
## $drop_factor_threshold
## [1] -1
## 
## $verbose
## [1] FALSE
## 
## $startELBO
## [1] 1
## 
## $freqELBO
## [1] 1Prepare the MOFA object
MOFAobject <- prepare_mofa(
  object = MOFAobject,
  data_options = data_opts,
  model_options = model_opts,
  training_options = train_opts
)Train the MOFA model. Remember that in this step the MOFA2 R package connets with the
mofapy2 Python package using reticulate. This is the source of most problems when
running MOFA. See our FAQ section
if you have issues.
outfile = file.path(getwd(),"model.hdf5")
MOFAobject.trained <- run_mofa(MOFAobject, outfile)## Connecting to the mofapy2 python package using reticulate (use_basilisk = FALSE)... 
##     Please make sure to manually specify the right python binary when loading R with reticulate::use_python(..., force=TRUE) or the right conda environment with reticulate::use_condaenv(..., force=TRUE)
##     If you prefer to let us automatically install a conda environment with 'mofapy2' installed using the 'basilisk' package, please use the argument 'use_basilisk = TRUE'## 3 factors were found to explain little or no variance and they were removed for downstream analysis. You can disable this option by setting load_model(..., remove_inactive_factors = F)If everything is successful, you should observe an output analogous to the following:
######################################
## Training the model with seed 1 ##
######################################
Iteration 1: time=0.03, ELBO=-52650.68, deltaELBO=837116.802 (94.082647669%), Factors=10
(...)
Iteration 9: time=0.04, ELBO=-50114.43, deltaELBO=23.907 (0.002686924%), Factors=10
#######################
## Training finished ##
#######################
Saving model in `/Users/ricard/data/mofa2/hdf5/model.hdf5.../tmp/RtmpdlDUU7/Rbuild32f755b4fd0c/MOFA2/vignettes/model.hdf5.This finishes the tutorial on how to train a MOFA object from R. To continue with the downstream analysis, follow this tutorial
Session Info
sessionInfo()## R version 4.0.3 (2020-10-10)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.5 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.12-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.12-bioc/R/lib/libRlapack.so
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_US.UTF-8        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] data.table_1.13.2 MOFA2_1.0.1       ggplot2_3.3.2     BiocStyle_2.18.0 
## 
## loaded via a namespace (and not attached):
##  [1] nlme_3.1-150         matrixStats_0.57.0   filelock_1.0.2      
##  [4] RColorBrewer_1.1-2   tools_4.0.3          backports_1.2.0     
##  [7] R6_2.5.0             HDF5Array_1.18.0     uwot_0.1.8          
## [10] BiocGenerics_0.36.0  mgcv_1.8-33          colorspace_1.4-1    
## [13] rhdf5filters_1.2.0   withr_2.3.0          tidyselect_1.1.0    
## [16] GGally_2.0.0         curl_4.3             compiler_4.0.3      
## [19] basilisk.utils_1.2.0 DelayedArray_0.16.0  labeling_0.4.2      
## [22] bookdown_0.21        scales_1.1.1         rappdirs_0.3.1      
## [25] stringr_1.4.0        digest_0.6.27        foreign_0.8-80      
## [28] rmarkdown_2.5        basilisk_1.2.0       rio_0.5.16          
## [31] pkgconfig_2.0.3      htmltools_0.5.0      MatrixGenerics_1.2.0
## [34] rlang_0.4.8          readxl_1.3.1         FNN_1.1.3           
## [37] farver_2.0.3         generics_0.1.0       jsonlite_1.7.1      
## [40] dplyr_1.0.2          zip_2.1.1            car_3.0-10          
## [43] magrittr_1.5         Matrix_1.2-18        Rcpp_1.0.5          
## [46] munsell_0.5.0        S4Vectors_0.28.0     Rhdf5lib_1.12.0     
## [49] abind_1.4-5          reticulate_1.18      lifecycle_0.2.0     
## [52] stringi_1.5.3        yaml_2.2.1           carData_3.0-4       
## [55] rhdf5_2.34.0         Rtsne_0.15           plyr_1.8.6          
## [58] grid_4.0.3           parallel_4.0.3       ggrepel_0.8.2       
## [61] forcats_0.5.0        crayon_1.3.4         lattice_0.20-41     
## [64] haven_2.3.1          cowplot_1.1.0        splines_4.0.3       
## [67] hms_0.5.3            magick_2.5.0         knitr_1.30          
## [70] pillar_1.4.6         ggpubr_0.4.0         ggsignif_0.6.0      
## [73] reshape2_1.4.4       stats4_4.0.3         glue_1.4.2          
## [76] evaluate_0.14        BiocManager_1.30.10  vctrs_0.3.4         
## [79] cellranger_1.1.0     gtable_0.3.0         purrr_0.3.4         
## [82] tidyr_1.1.2          reshape_0.8.8        xfun_0.19           
## [85] openxlsx_4.2.3       broom_0.7.2          RSpectra_0.16-0     
## [88] rstatix_0.6.0        tibble_3.0.4         pheatmap_1.0.12     
## [91] IRanges_2.24.0       corrplot_0.84        ellipsis_0.3.1