Compiled date: 2023-10-24
Last edited: 2022-08-01
License: GPL-3
Run the following code to install the Bioconductor version of package.
# install.packages("BiocManager")
BiocManager::install("POMA")
library(POMA)
You can also load some additional packages that will be very useful in this vignette.
library(ggplot2)
library(ggraph)
library(plotly)
POMA
functions can be divided in three sequential well separated blocks: Data Preparation, Pre-processing and Statistical Analysis.
The SummarizedExperiment Bioconductor package provides a well defined computational data structures to represent omics experiment data types (Morgan et al. 2020). Since data structures can mean a marked improvement in data analysis, POMA functions use SummarizedExperiment objects from SummarizedExperiment package, allowing the reusability of existing methods for this class and contributing to the improvement of robust and reproducible workflows.
The first step of workflow will be load or create a SummarizedExperiment
object. Often, you will have your data stored in separated matrix and/or data frames and you will want to create your SummarizedExperiment
object. The PomaSummarizedExperiment
function makes this step fast and easy building this SummarizedExperiment
object for you.
# create an SummarizedExperiment object from two separated data frames
target <- readr::read_csv("your_target.csv")
features <- readr::read_csv("your_features.csv")
data <- PomaSummarizedExperiment(target = target, features = features)
Alternatively, if your data is already stored in a SummarizedExperiment
object, you can skip this step and go directly to the pre-processing step. In this vignette we will use the sample data provided in POMA
.
# load example data
data("st000336")
st000336
> class: SummarizedExperiment
> dim: 31 57
> metadata(0):
> assays(1): ''
> rownames(31): x1_methylhistidine x3_methylhistidine ... pyruvate
> succinate
> rowData names(0):
> colnames(57): DMD004.1.U02 DMD005.1.U02 ... DMD167.5.U02 DMD173.1.U02
> colData names(2): group steroids
This example data is composed of 57 samples, 31 metabolites, 1 covariate and 2 experimental groups (Controls and DMD) from a targeted LC/MS study.
Duchenne Muscular Dystrophy (DMD) is an X-linked recessive form of muscular dystrophy that affects males via a mutation in the gene for the muscle protein, dystrophin. Progression of the disease results in severe muscle loss, ultimately leading to paralysis and death. Steroid therapy has been a commonly employed method for reducing the severity of symptoms. This study aims to quantify the urine levels of amino acids and organic acids in patients with DMD both with and without steroid treatment. Track the progression of DMD in patients who have provided multiple urine samples.
This data was collected from here.
This is a critical point in the workflow because all final statistical results will depend on the decisions made here. Again, this block can be divided in 3 steps: Missing Value Imputation, Normalization and Outlier Detection.
Often, due to biological and technical reasons, some features can not be identified or quantified in some samples in MS (Armitage et al. 2015). POMA offers 7 different imputation methods to deal with this situation. Just run the following line of code to impute your missings!
imputed <- PomaImpute(st000336, ZerosAsNA = TRUE, RemoveNA = TRUE, cutoff = 20, method = "knn")
imputed
> class: SummarizedExperiment
> dim: 30 57
> metadata(0):
> assays(1): ''
> rownames(30): x1_methylhistidine x3_methylhistidine ... pyruvate
> succinate
> rowData names(0):
> colnames(57): DMD004.1.U02 DMD005.1.U02 ... DMD167.5.U02 DMD173.1.U02
> colData names(2): group steroids
The next step of this block is the data normalization. Often, some factors can introduce variability in some types of MS data having a critical influence on the final statistical results, making normalization a key step in the workflow (Berg et al. 2006). Again, POMA offers several methods to normalize the data by running just the following line of code:
normalized <- PomaNorm(imputed, method = "log_pareto")
normalized
> class: SummarizedExperiment
> dim: 30 57
> metadata(0):
> assays(1): ''
> rownames(30): x1_methylhistidine x3_methylhistidine ... pyruvate
> succinate
> rowData names(0):
> colnames(57): DMD004.1.U02 DMD005.1.U02 ... DMD167.5.U02 DMD173.1.U02
> colData names(2): group steroids
Sometimes, you will be interested in how the normalization process affect your data?
To answer this question, POMA offers two exploratory functions, PomaBoxplots
and PomaDensity
, that can help to understand the normalization process.
PomaBoxplots
generates boxplots for all samples or features (depending on the group factor) of a SummarizedExperiment
object. Here, we can compare objects before and after normalization step.
PomaBoxplots(imputed, group = "samples",
jitter = FALSE,
legend_position = "none") +
ggplot2::ggtitle("Not Normalized") # data before normalization
PomaBoxplots(normalized,
group = "samples",
jitter = FALSE,
legend_position = "none") +
ggplot2::ggtitle("Normalized") # data after normalization
On the other hand, PomaDensity
shows the distribution of all features before and after the normalization process.
PomaDensity(imputed,
group = "features",
legend_position = "none") +
ggplot2::ggtitle("Not Normalized") # data before normalization
PomaDensity(normalized,
group = "features") +
ggplot2::ggtitle("Normalized") # data after normalization
Finally, the last step of this block is the Outlier Detection. Outlers are defined as observations that are not concordant with those of the vast majority of the remaining data points. These values can have an enormous influence on the resultant statistical analysis, being a dangerous ground for all required assumptions in the most commonly applied parametric tests in mass spectrometry as well as for all also required assumptions in many regression techniques and predictive modeling approaches. POMA allows the analysis of outliers as well as the possibility to remove them from the analysis using different modulable parameters.
Analyze and remove outliers running the following two lines of code.
PomaOutliers(normalized, do = "analyze")$polygon_plot # to explore
pre_processed <- PomaOutliers(normalized, do = "clean") # to remove outliers
pre_processed
> class: SummarizedExperiment
> dim: 30 50
> metadata(0):
> assays(1): ''
> rownames(30): x1_methylhistidine x3_methylhistidine ... pyruvate
> succinate
> rowData names(0):
> colnames(50): DMD004.1.U02 DMD005.1.U02 ... DMD167.5.U02 DMD173.1.U02
> colData names(2): group steroids
Once the data have been pre-processed, you can start with the statistical analysis step! POMA offers many different statistical methods and possible combinations to compute. However, in this vignette we will comment only some of the most used.
POMA allows you to perform all of the most used univariate statistical methods in MS by using only one function! PomaUnivariate
wrap 4 different univariate methods (ttest, ANOVA and ANCOVA, Wilcoxon test and Kruskal-Wallis Rank Sum Test) that you can perform changing only the “method” argument.
PomaUnivariate(pre_processed, method = "ttest")
> # A tibble: 30 × 9
> feature FC diff_means pvalue pvalueAdj mean_Controls mean_DMD
> <chr> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
> 1 x1_methylhistidine -0.401 0.563 9.30e-8 3.10e-7 -0.402 0.161
> 2 x3_methylhistidine -0.46 0.613 7.82e-3 9.03e-3 -0.420 0.193
> 3 alanine -0.346 0.426 6.62e-4 8.63e-4 -0.317 0.109
> 4 arginine -0.558 0.179 4.80e-1 4.80e-1 -0.115 0.0641
> 5 asparagine -0.367 0.475 1.28e-5 2.40e-5 -0.348 0.128
> 6 aspartic_acid -0.35 0.343 3.30e-2 3.54e-2 -0.254 0.0889
> 7 glutamic_acid -0.274 0.587 1.15e-4 1.82e-4 -0.461 0.126
> 8 glutamine -0.477 0.438 5.72e-4 7.80e-4 -0.297 0.141
> 9 glycine -0.589 0.412 3.98e-3 4.97e-3 -0.259 0.153
> 10 histidine -0.544 0.383 4.13e-4 5.90e-4 -0.248 0.135
> # ℹ 20 more rows
> # ℹ 2 more variables: sd_Controls <dbl>, sd_DMD <dbl>
You can also compute a volcano plot using the T-test results. Note that we’re using the non-normalized object to avoid negative values in our data.
PomaVolcano(imputed, pval = "adjusted")
PomaUnivariate(pre_processed, method = "mann")
> # A tibble: 30 × 9
> feature FC diff_means pvalue pvalueAdj mean_Controls mean_DMD
> <chr> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
> 1 x1_methylhistidine -0.401 0.563 6.21e-5 0.000143 -0.402 0.161
> 2 x3_methylhistidine -0.46 0.613 9.99e-3 0.0115 -0.420 0.193
> 3 alanine -0.346 0.426 2.15e-4 0.000404 -0.317 0.109
> 4 arginine -0.558 0.179 1.40e-1 0.145 -0.115 0.0641
> 5 asparagine -0.367 0.475 2.47e-4 0.000436 -0.348 0.128
> 6 aspartic_acid -0.35 0.343 5.71e-3 0.00685 -0.254 0.0889
> 7 glutamic_acid -0.274 0.587 6.01e-4 0.000859 -0.461 0.126
> 8 glutamine -0.477 0.438 2.94e-3 0.00383 -0.297 0.141
> 9 glycine -0.589 0.412 4.20e-3 0.00525 -0.259 0.153
> 10 histidine -0.544 0.383 2.51e-3 0.00342 -0.248 0.135
> # ℹ 20 more rows
> # ℹ 2 more variables: sd_Controls <dbl>, sd_DMD <dbl>
Other of the wide used statistical methods in many different omics, such as epigenomics or transcriptomics, is limma (Ritchie et al. 2015). POMA provides an easy use implementation of limma you only have to specify the desired contrast to compute.
PomaLimma(pre_processed, contrast = "Controls-DMD", adjust = "fdr")
> # A tibble: 30 × 7
> feature logFC AveExpr t P.Value adj.P.Val B
> <chr> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
> 1 tryptophan -0.775 0.00862 -7.01 0.00000000269 0.0000000807 11.0
> 2 valine -0.701 0.0127 -6.63 0.0000000116 0.000000173 9.55
> 3 ornithine -0.633 0.0337 -6.26 0.0000000479 0.000000479 8.16
> 4 isoleucine -0.606 0.00438 -5.95 0.000000159 0.00000119 6.99
> 5 lactate -0.785 0.0184 -5.69 0.000000430 0.00000258 6.02
> 6 pyruvate -0.624 0.0121 -5.43 0.00000112 0.00000514 5.09
> 7 leucine -0.616 0.0153 -5.41 0.00000120 0.00000514 5.02
> 8 methionine -0.552 0.0197 -4.91 0.00000764 0.0000287 3.22
> 9 serine -0.536 0.0448 -4.76 0.0000132 0.0000440 2.69
> 10 x1_methylhistidine -0.563 0.0373 -4.73 0.0000147 0.0000440 2.59
> # ℹ 20 more rows
On the other hand, multivariate analysis implemented in POMA is quite similar to the univariate approaches. PomaMultivariate
allows users to compute a PCA, PLS-DA or sPLS-DA by changing only the “method” parameter. This function is based on mixOmics package (Rohart et al. 2017).
poma_pca <- PomaMultivariate(pre_processed, method = "pca")
poma_pca$scoresplot +
ggplot2::ggtitle("Scores Plot")
> Warning: The following aesthetics were dropped during statistical transformation: label
> ℹ This can happen when ggplot fails to infer the correct grouping structure in
> the data.
> ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
> variable into a factor?
poma_plsda <- PomaMultivariate(pre_processed, method = "plsda")
poma_plsda$scoresplot +
ggplot2::ggtitle("Scores Plot")
> Warning: The following aesthetics were dropped during statistical transformation: label
> ℹ This can happen when ggplot fails to infer the correct grouping structure in
> the data.
> ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
> variable into a factor?
poma_plsda$errors_plsda_plot +
ggplot2::ggtitle("Error Plot")
Often, correlation analysis is used to explore and discover relationships and patterns within our data. PomaCorr
provides a flexible and easy way to do that providing a table with all pairwise coorelations in the data, a correlogram and a correlation graph.
poma_cor <- PomaCorr(pre_processed, label_size = 8, coeff = 0.6)
poma_cor$correlations
> # A tibble: 435 × 5
> feature1 feature2 corr pvalue FDR
> <chr> <chr> <dbl> <dbl> <dbl>
> 1 isoleucine leucine 0.963 5.03e-29 2.19e-26
> 2 leucine valine 0.941 3.77e-24 7.11e-22
> 3 fumarate malate 0.940 4.90e-24 7.11e-22
> 4 isoleucine valine 0.938 1.07e-23 1.17e-21
> 5 asparagine threonine 0.907 1.25e-19 1.09e-17
> 6 serine threonine 0.893 2.83e-18 1.81e-16
> 7 phenylalanine tyrosine 0.893 2.91e-18 1.81e-16
> 8 tryptophan tyrosine 0.887 9.64e-18 5.24e-16
> 9 leucine phenylalanine 0.876 8.53e-17 4.13e-15
> 10 asparagine serine 0.871 2.09e-16 9.07e-15
> # ℹ 425 more rows
poma_cor$corrplot
poma_cor$graph
Alternatively, if you switch the “corr_type” parameter to “glasso”, this function will compute a Gaussian Graphical Model using the glmnet package (Friedman, Hastie, and Tibshirani 2019).
PomaCorr(pre_processed, corr_type = "glasso", coeff = 0.6)$graph
POMA also provides a function to perform a Lasso, Ridge and Elasticnet regression for binary outcomes in a very intuitive and easy way. PomaLasso
is based on glmnet package (Friedman, Hastie, and Tibshirani 2010). This function allows you to create a test subset in your data, evaluate the prediction of your models and export the model computed (it could be useful to perform prediction models with MS data). If “ntest” parameter is set to NULL, PomaLasso
will use all observations to create the model (useful for feature selection).
# alpha = 1 for Lasso
PomaLasso(pre_processed, alpha = 1, labels = TRUE)$coefficientPlot
Finally, the random forest algorithm is also implemented in POMA. PomaRandForest
uses the randomForest package (Liaw and Wiener 2002) to facilitate the implementation of the algorithm and creates automatically both test and train sets to compute and evaluate the resultant models.
poma_rf <- PomaRandForest(pre_processed, ntest = 10, nvar = 10)
poma_rf$error_tree
Resultant random forest model confusion matrix for test set:
poma_rf$confusionMatrix$table
> Reference
> Prediction Controls DMD
> Controls 2 1
> DMD 0 2
Gini index plot for the top 10 predictors:
poma_rf$MeanDecreaseGini_plot
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] SummarizedExperiment_1.32.0 Biobase_2.62.0
> [3] GenomicRanges_1.54.0 GenomeInfoDb_1.38.0
> [5] IRanges_2.36.0 S4Vectors_0.40.0
> [7] BiocGenerics_0.48.0 MatrixGenerics_1.14.0
> [9] matrixStats_1.0.0 plotly_4.10.3
> [11] ggraph_2.1.0 ggplot2_3.4.4
> [13] POMA_1.12.0 BiocStyle_2.30.0
>
> loaded via a namespace (and not attached):
> [1] RColorBrewer_1.1-3 jsonlite_1.8.7 shape_1.4.6
> [4] magrittr_2.0.3 magick_2.8.1 farver_2.1.1
> [7] rmarkdown_2.25 zlibbioc_1.48.0 vctrs_0.6.4
> [10] RCurl_1.98-1.12 htmltools_0.5.6.1 S4Arrays_1.2.0
> [13] broom_1.0.5 pROC_1.18.4 SparseArray_1.2.0
> [16] caret_6.0-94 parallelly_1.36.0 sass_0.4.7
> [19] bslib_0.5.1 htmlwidgets_1.6.2 plyr_1.8.9
> [22] lubridate_1.9.3 impute_1.76.0 cachem_1.0.8
> [25] igraph_1.5.1 lifecycle_1.0.3 iterators_1.0.14
> [28] pkgconfig_2.0.3 Matrix_1.6-1.1 R6_2.5.1
> [31] fastmap_1.1.1 future_1.33.0 GenomeInfoDbData_1.2.11
> [34] digest_0.6.33 colorspace_2.1-0 rARPACK_0.11-0
> [37] RSpectra_0.16-1 ellipse_0.5.0 vegan_2.6-4
> [40] labeling_0.4.3 randomForest_4.7-1.1 timechange_0.2.0
> [43] fansi_1.0.5 httr_1.4.7 polyclip_1.10-6
> [46] abind_1.4-5 mgcv_1.9-0 compiler_4.3.1
> [49] proxy_0.4-27 withr_2.5.1 glasso_1.11
> [52] backports_1.4.1 BiocParallel_1.36.0 viridis_0.6.4
> [55] ggforce_0.4.1 MASS_7.3-60 lava_1.7.2.1
> [58] DelayedArray_0.28.0 corpcor_1.6.10 permute_0.9-7
> [61] ModelMetrics_1.2.2.2 tools_4.3.1 future.apply_1.11.0
> [64] nnet_7.3-19 glue_1.6.2 nlme_3.1-163
> [67] grid_4.3.1 cluster_2.1.4 reshape2_1.4.4
> [70] generics_0.1.3 recipes_1.0.8 gtable_0.3.4
> [73] class_7.3-22 tidyr_1.3.0 data.table_1.14.8
> [76] tidygraph_1.2.3 utf8_1.2.4 XVector_0.42.0
> [79] ggrepel_0.9.4 foreach_1.5.2 pillar_1.9.0
> [82] stringr_1.5.0 limma_3.58.0 splines_4.3.1
> [85] dplyr_1.1.3 tweenr_2.0.2 lattice_0.22-5
> [88] survival_3.5-7 tidyselect_1.2.0 mixOmics_6.26.0
> [91] knitr_1.44 gridExtra_2.3 bookdown_0.36
> [94] xfun_0.40 graphlayouts_1.0.1 statmod_1.5.0
> [97] hardhat_1.3.0 timeDate_4022.108 stringi_1.7.12
> [100] lazyeval_0.2.2 yaml_2.3.7 evaluate_0.22
> [103] codetools_0.2-19 tibble_3.2.1 BiocManager_1.30.22
> [106] cli_3.6.1 rpart_4.1.21 munsell_0.5.0
> [109] jquerylib_0.1.4 Rcpp_1.0.11 globals_0.16.2
> [112] parallel_4.3.1 gower_1.0.1 bitops_1.0-7
> [115] listenv_0.9.0 glmnet_4.1-8 viridisLite_0.4.2
> [118] ipred_0.9-14 e1071_1.7-13 scales_1.2.1
> [121] prodlim_2023.08.28 purrr_1.0.2 crayon_1.5.2
> [124] rlang_1.1.1
Armitage, Emily Grace, Joanna Godzien, Vanesa Alonso-Herranz, Ángeles López-Gonzálvez, and Coral Barbas. 2015. “Missing Value Imputation Strategies for Metabolomics Data.” Electrophoresis 36 (24): 3050–60.
Berg, Robert A van den, Huub CJ Hoefsloot, Johan A Westerhuis, Age K Smilde, and Mariët J van der Werf. 2006. “Centering, Scaling, and Transformations: Improving the Biological Information Content of Metabolomics Data.” BMC Genomics 7 (1): 142.
Friedman, Jerome, Trevor Hastie, and Rob Tibshirani. 2019. Glasso: Graphical Lasso: Estimation of Gaussian Graphical Models. https://CRAN.R-project.org/package=glasso.
Friedman, Jerome, Trevor Hastie, and Robert Tibshirani. 2010. “Regularization Paths for Generalized Linear Models via Coordinate Descent.” Journal of Statistical Software 33 (1): 1–22. http://www.jstatsoft.org/v33/i01/.
Liaw, Andy, and Matthew Wiener. 2002. “Classification and Regression by randomForest.” R News 2 (3): 18–22. https://CRAN.R-project.org/doc/Rnews/.
Morgan, Martin, Valerie Obenchain, Jim Hester, and Hervé Pagès. 2020. SummarizedExperiment: SummarizedExperiment Container. https://bioconductor.org/packages/SummarizedExperiment.
Ritchie, Matthew E, Belinda Phipson, Di Wu, Yifang Hu, Charity W Law, Wei Shi, and Gordon K Smyth. 2015. “limma Powers Differential Expression Analyses for RNA-Sequencing and Microarray Studies.” Nucleic Acids Research 43 (7): e47. https://doi.org/10.1093/nar/gkv007.
Rohart, Florian, Benoît Gautier, Amrit Singh, and Kim-Anh Lê Cao. 2017. “MixOmics: An R Package for ’Omics Feature Selection and Multiple Data Integration.” PLoS Computational Biology 13 (11): e1005752. http://www.mixOmics.org.