Integrative analysis of metabolome and microbiome

Congcong Gong

library(mbOmic)

Introduction

The mbOmic package contains a set of analysis functions for microbiomics and metabolomics data, designed to analyze the inter-omic correlation between microbiology and metabolites, referencing the workflow of Jonathan Braun et al1.

# knitr::include_graphics(system.file('extdata', 'intro.png', 'mbOmic'))

Examples

Load metabolites and OTU abundance data of plant.2 The OTU had been binned into genera level and were save as the metabolites_and_genera.rda file

path <- system.file('extdata', 'metabolites_and_genera.rda', package = 'mbOmic')

load(path)

Construct mbSet object.

bSet is S4 class containing the metabolites abundance matrix.

We can use bSet function to directly create bSet class.

There are some function to get or set information of a bSet, such as samples and features.

Extract the samples names from bSet class by function Samples.

Remove bad analytes (OTU and metatoblites)

Removal of analytes only measured in <2 of samples can perform by clean_analytes.

Generate metabolite module

mbOmic can generate metabolite module by coExpress function. The coExpress function is the encapsulation of one-step network construction and module detection of WGCNA package. The coExpress function firstly pick up the soft-threshold. The threshold.d and threshold parameters are used to detect whether is \(R^2\) changing and appropriate.

If there are no appropriate threshold was detected and you do not set the power parameter, the coExpress will throw a error, “No power detected! pls set the power parameter”.

#> Error in coExpress(m, message = TRUE, threshold.d = 0.02, threshold = 0.8,  : 
#>   No power detected! pls set the power parameter
class(net)
#> [1] "try-error"

If you can’t get a good scale-free topology index no matter how high set the soft-thresholding power, you can directly set the power value by the parameter power, but should be looked into carefully. The appropriate soft-thresholding power can be chosen based on the number of samples as in the table below (recommend by WGCNA package).

Number of samples Unsigned and signed hybrid networks Signed networks
<20 9 18
20~30 8 16
30~40 7 14
>40 6 12

Calculate the Spearman metabolite-genera correlation

you can calculate the correlation between metabolites and OTUs by corr function. It return a data table containing rho, p value, and adjust p value. Moreover, the corr can run in parallel mode.

plot the network

Finally, you can vaisulize the network by plot_network function, taking the coExpressand corr output. The orange nodes correspondes to OTU(genera)).

# visSave(tmp, file = '../inst/doc/network2.html')

SessionInfo

devtools::session_info()
#> ─ Session info ───────────────────────────────────────────────────────────────
#>  setting  value
#>  version  R version 4.2.0 RC (2022-04-19 r82224)
#>  os       Ubuntu 20.04.4 LTS
#>  system   x86_64, linux-gnu
#>  ui       X11
#>  language (EN)
#>  collate  C
#>  ctype    en_US.UTF-8
#>  tz       America/New_York
#>  date     2022-04-27
#>  pandoc   2.5 @ /usr/bin/ (via rmarkdown)
#> 
#> ─ Packages ───────────────────────────────────────────────────────────────────
#>  package          * version  date (UTC) lib source
#>  AnnotationDbi      1.58.0   2022-04-27 [2] Bioconductor
#>  assertthat         0.2.1    2019-03-21 [2] CRAN (R 4.2.0)
#>  backports          1.4.1    2021-12-13 [2] CRAN (R 4.2.0)
#>  base64enc          0.1-3    2015-07-28 [2] CRAN (R 4.2.0)
#>  Biobase            2.56.0   2022-04-27 [2] Bioconductor
#>  BiocGenerics       0.42.0   2022-04-27 [2] Bioconductor
#>  Biostrings         2.64.0   2022-04-27 [2] Bioconductor
#>  bit                4.0.4    2020-08-04 [2] CRAN (R 4.2.0)
#>  bit64              4.0.5    2020-08-30 [2] CRAN (R 4.2.0)
#>  bitops             1.0-7    2021-04-24 [2] CRAN (R 4.2.0)
#>  blob               1.2.3    2022-04-10 [2] CRAN (R 4.2.0)
#>  brio               1.1.3    2021-11-30 [2] CRAN (R 4.2.0)
#>  bslib              0.3.1    2021-10-06 [2] CRAN (R 4.2.0)
#>  cachem             1.0.6    2021-08-19 [2] CRAN (R 4.2.0)
#>  callr              3.7.0    2021-04-20 [2] CRAN (R 4.2.0)
#>  checkmate          2.1.0    2022-04-21 [2] CRAN (R 4.2.0)
#>  cli                3.3.0    2022-04-25 [2] CRAN (R 4.2.0)
#>  cluster            2.1.3    2022-03-28 [2] CRAN (R 4.2.0)
#>  codetools          0.2-18   2020-11-04 [2] CRAN (R 4.2.0)
#>  colorspace         2.0-3    2022-02-21 [2] CRAN (R 4.2.0)
#>  crayon             1.5.1    2022-03-26 [2] CRAN (R 4.2.0)
#>  data.table         1.14.2   2021-09-27 [2] CRAN (R 4.2.0)
#>  DBI                1.1.2    2021-12-20 [2] CRAN (R 4.2.0)
#>  desc               1.4.1    2022-03-06 [2] CRAN (R 4.2.0)
#>  devtools           2.4.3    2021-11-30 [2] CRAN (R 4.2.0)
#>  digest             0.6.29   2021-12-01 [2] CRAN (R 4.2.0)
#>  doParallel         1.0.17   2022-02-07 [2] CRAN (R 4.2.0)
#>  dplyr              1.0.8    2022-02-08 [2] CRAN (R 4.2.0)
#>  dynamicTreeCut     1.63-1   2016-03-11 [2] CRAN (R 4.2.0)
#>  ellipsis           0.3.2    2021-04-29 [2] CRAN (R 4.2.0)
#>  evaluate           0.15     2022-02-18 [2] CRAN (R 4.2.0)
#>  fansi              1.0.3    2022-03-24 [2] CRAN (R 4.2.0)
#>  fastcluster        1.2.3    2021-05-24 [2] CRAN (R 4.2.0)
#>  fastmap            1.1.0    2021-01-25 [2] CRAN (R 4.2.0)
#>  foreach            1.5.2    2022-02-02 [2] CRAN (R 4.2.0)
#>  foreign            0.8-82   2022-01-16 [2] CRAN (R 4.2.0)
#>  Formula            1.2-4    2020-10-16 [2] CRAN (R 4.2.0)
#>  fs                 1.5.2    2021-12-08 [2] CRAN (R 4.2.0)
#>  generics           0.1.2    2022-01-31 [2] CRAN (R 4.2.0)
#>  GenomeInfoDb       1.32.0   2022-04-27 [2] Bioconductor
#>  GenomeInfoDbData   1.2.8    2022-04-21 [2] Bioconductor
#>  ggplot2            3.3.5    2021-06-25 [2] CRAN (R 4.2.0)
#>  glue               1.6.2    2022-02-24 [2] CRAN (R 4.2.0)
#>  GO.db              3.15.0   2022-04-21 [2] Bioconductor
#>  gridExtra          2.3      2017-09-09 [2] CRAN (R 4.2.0)
#>  gtable             0.3.0    2019-03-25 [2] CRAN (R 4.2.0)
#>  highr              0.9      2021-04-16 [2] CRAN (R 4.2.0)
#>  Hmisc              4.7-0    2022-04-19 [2] CRAN (R 4.2.0)
#>  htmlTable          2.4.0    2022-01-04 [2] CRAN (R 4.2.0)
#>  htmltools          0.5.2    2021-08-25 [2] CRAN (R 4.2.0)
#>  htmlwidgets        1.5.4    2021-09-08 [2] CRAN (R 4.2.0)
#>  httr               1.4.2    2020-07-20 [2] CRAN (R 4.2.0)
#>  igraph             1.3.1    2022-04-20 [2] CRAN (R 4.2.0)
#>  impute             1.70.0   2022-04-27 [2] Bioconductor
#>  IRanges            2.30.0   2022-04-27 [2] Bioconductor
#>  iterators          1.0.14   2022-02-05 [2] CRAN (R 4.2.0)
#>  jpeg               0.1-9    2021-07-24 [2] CRAN (R 4.2.0)
#>  jquerylib          0.1.4    2021-04-26 [2] CRAN (R 4.2.0)
#>  jsonlite           1.8.0    2022-02-22 [2] CRAN (R 4.2.0)
#>  KEGGREST           1.36.0   2022-04-27 [2] Bioconductor
#>  knitr              1.39     2022-04-26 [2] CRAN (R 4.2.0)
#>  lattice            0.20-45  2021-09-22 [2] CRAN (R 4.2.0)
#>  latticeExtra       0.6-29   2019-12-19 [2] CRAN (R 4.2.0)
#>  lifecycle          1.0.1    2021-09-24 [2] CRAN (R 4.2.0)
#>  magrittr           2.0.3    2022-03-30 [2] CRAN (R 4.2.0)
#>  Matrix             1.4-1    2022-03-23 [2] CRAN (R 4.2.0)
#>  matrixStats        0.62.0   2022-04-19 [2] CRAN (R 4.2.0)
#>  mbOmic           * 1.0.0    2022-04-27 [1] Bioconductor
#>  memoise            2.0.1    2021-11-26 [2] CRAN (R 4.2.0)
#>  mnormt             2.0.2    2020-09-01 [2] CRAN (R 4.2.0)
#>  munsell            0.5.0    2018-06-12 [2] CRAN (R 4.2.0)
#>  nlme               3.1-157  2022-03-25 [2] CRAN (R 4.2.0)
#>  nnet               7.3-17   2022-01-16 [2] CRAN (R 4.2.0)
#>  pillar             1.7.0    2022-02-01 [2] CRAN (R 4.2.0)
#>  pkgbuild           1.3.1    2021-12-20 [2] CRAN (R 4.2.0)
#>  pkgconfig          2.0.3    2019-09-22 [2] CRAN (R 4.2.0)
#>  pkgload            1.2.4    2021-11-30 [2] CRAN (R 4.2.0)
#>  png                0.1-7    2013-12-03 [2] CRAN (R 4.2.0)
#>  preprocessCore     1.58.0   2022-04-27 [2] Bioconductor
#>  prettyunits        1.1.1    2020-01-24 [2] CRAN (R 4.2.0)
#>  processx           3.5.3    2022-03-25 [2] CRAN (R 4.2.0)
#>  ps                 1.7.0    2022-04-23 [2] CRAN (R 4.2.0)
#>  psych              2.2.3    2022-03-19 [2] CRAN (R 4.2.0)
#>  purrr              0.3.4    2020-04-17 [2] CRAN (R 4.2.0)
#>  R6                 2.5.1    2021-08-19 [2] CRAN (R 4.2.0)
#>  RColorBrewer       1.1-3    2022-04-03 [2] CRAN (R 4.2.0)
#>  Rcpp               1.0.8.3  2022-03-17 [2] CRAN (R 4.2.0)
#>  RCurl              1.98-1.6 2022-02-08 [2] CRAN (R 4.2.0)
#>  remotes            2.4.2    2021-11-30 [2] CRAN (R 4.2.0)
#>  rlang              1.0.2    2022-03-04 [2] CRAN (R 4.2.0)
#>  rmarkdown          2.14     2022-04-25 [2] CRAN (R 4.2.0)
#>  rpart              4.1.16   2022-01-24 [2] CRAN (R 4.2.0)
#>  rprojroot          2.0.3    2022-04-02 [2] CRAN (R 4.2.0)
#>  RSQLite            2.2.12   2022-04-02 [2] CRAN (R 4.2.0)
#>  rstudioapi         0.13     2020-11-12 [2] CRAN (R 4.2.0)
#>  S4Vectors          0.34.0   2022-04-27 [2] Bioconductor
#>  sass               0.4.1    2022-03-23 [2] CRAN (R 4.2.0)
#>  scales             1.2.0    2022-04-13 [2] CRAN (R 4.2.0)
#>  sessioninfo        1.2.2    2021-12-06 [2] CRAN (R 4.2.0)
#>  stringi            1.7.6    2021-11-29 [2] CRAN (R 4.2.0)
#>  stringr            1.4.0    2019-02-10 [2] CRAN (R 4.2.0)
#>  survival           3.3-1    2022-03-03 [2] CRAN (R 4.2.0)
#>  testthat           3.1.4    2022-04-26 [2] CRAN (R 4.2.0)
#>  tibble             3.1.6    2021-11-07 [2] CRAN (R 4.2.0)
#>  tidyselect         1.1.2    2022-02-21 [2] CRAN (R 4.2.0)
#>  tmvnsim            1.0-2    2016-12-15 [2] CRAN (R 4.2.0)
#>  usethis            2.1.5    2021-12-09 [2] CRAN (R 4.2.0)
#>  utf8               1.2.2    2021-07-24 [2] CRAN (R 4.2.0)
#>  vctrs              0.4.1    2022-04-13 [2] CRAN (R 4.2.0)
#>  visNetwork         2.1.0    2021-09-29 [2] CRAN (R 4.2.0)
#>  WGCNA              1.71     2022-04-22 [2] CRAN (R 4.2.0)
#>  withr              2.5.0    2022-03-03 [2] CRAN (R 4.2.0)
#>  xfun               0.30     2022-03-02 [2] CRAN (R 4.2.0)
#>  XVector            0.36.0   2022-04-27 [2] Bioconductor
#>  yaml               2.3.5    2022-02-21 [2] CRAN (R 4.2.0)
#>  zlibbioc           1.42.0   2022-04-27 [2] Bioconductor
#> 
#>  [1] /tmp/RtmpvToPOC/Rinst2c681c42aa7dd8
#>  [2] /home/biocbuild/bbs-3.15-bioc/R/library
#> 
#> ──────────────────────────────────────────────────────────────────────────────

  1. McHardy, I. H., Goudarzi, M., Tong, M., Ruegger, P. M., Schwager, E., Weger, J. R., Graeber, T. G., Sonnenburg, J. L., Horvath, S., Huttenhower, C., McGovern, D. P., Fornace, A. J., Borneman, J., & Braun, J. (2013). Integrative analysis of the microbiome and metabolome of the human intestinal mucosal surface reveals exquisite inter-relationships. Microbiome, 1(1), 17. https://doi.org/10.1186/2049-2618-1-17

  2. Huang, W., Sun, D., Chen, L., & An, Y. (2021). Integrative analysis of the microbiome and metabolome in understanding the causes of sugarcane bitterness. Scientific Reports, 11(1), 1-11.