Contents

1 Introduction

The aim of famat is to allow users to determine functional links between metabolites and genes. These metabolites and genes lists may be related to a specific experiment/study, but famat only needs a gene symbols list and a Kegg Compound ids list. Using these lists, famat performs pathway enrichment analysis, direct interactions between elements inside pathways extraction, GO terms enrichment analysis, calculation of user’s elements centrality (number of direct interactions between an element and others inside a pathway) and extraction of information related to user’s elements.

Functions available are:

2 Installation

Run this command line to install famat.

if (!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")

BiocManager::install("famat")

Then, load famat using library.

library(famat)
library(mgcv)

3 path_enrich

This function uses the metabolite list and the gene list provided by user to perform pathway enrichment analysis. Metabolites ids need to be Kegg compound ids, and genes ids need to be gene symbols. Three pathway databases are available: Kegg (“KEGG”), Wikipathways (“WP”) and Reactome (“REAC”).

data(genes)
data(meta)

listr=path_enrich("REAC", meta, genes)
## your input componentList have 2 components in background
## your input componentList have 2 components in network

Results are then stored into a list. This list must be used in “interactions” function. Pathways enrichment analysis is performed on genes using gprofiler2 and on metabolites using MPINet.

4 interactions

“Interactions” find all direct interactions between genes and metabolites of user’s lists in pathways obtained through pathways enrichment analysis, performed on KEGG, Reactome and Wikipathways pathways. So, this function needs results of “path_enrich” function performed on all these databases. Using direct interactions, centrality of a user’s element inside a pathway is calculated.

data(listk)
data(listr)
data(listw)

interactions_result = interactions(listk, listr, listw)

Results are then stored into a list. This list must be used in “compl_data” function. Direct interactions were collected from BioPax, KGML and GPML files parsed with PaxtoolsR, graphite and author’s parsers. “Interactions” just get interactions of enriched pathways from this direct interactions list.

5 compl_data

This function complete information about elements and pathway obtained with “path_enrich” and “interactions”. A GO term enrichment analysis is performed on genes, pathways obtained through pathways enrichment analysis are filtered (they must contain at least 1/5 elements in user’s lists or a direct interaction between user’s elements) and a hierarchy parent-child is built with pathways and enriched GO terms. GO terms enrichment analysis is performed using clusterProfiler. Then, dataframes containing information about elements, interactions and GO terms are created, with an heatmap showing which user’s elements are in which pathways.

data(interactions_result)

compl_data_result <- compl_data(interactions_result)

Results are then stored into a list. This list must be used in “rshiny” function.

6 rshiny

All results obtained with the three previous functions can be visualized using “rshiny” function. shiny is a R package allowing to create interfaces.

data(compl_data_result)

rshiny(compl_data_result)

After using this command line, the shiny interface appear.

test Interface’s tabs are:

Finally, a “Reset” button was made to go back to the initial results.

7 Conclusion: how to use famat

To conclude, famat has four important functions which have to be used one after another:

data(genes)
data(meta)

listk <- path_enrich("KEGG", meta, genes)
listr <- path_enrich("REAC", meta, genes)
listw <- path_enrich("WP", meta, genes)

interactions_result <- interactions(listk, listr, listw)

compl_data_result <- compl_data(interactions_result)

rshiny(compl_data_result)

8 References

Appendix

A Session Info

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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] mgcv_1.9-0       nlme_3.1-163     famat_1.12.0     BiocStyle_2.30.0
## 
## loaded via a namespace (and not attached):
##   [1] RColorBrewer_1.1-3            jsonlite_1.8.7               
##   [3] magrittr_2.0.3                farver_2.1.1                 
##   [5] rmarkdown_2.25                fs_1.6.3                     
##   [7] zlibbioc_1.48.0               vctrs_0.6.4                  
##   [9] memoise_2.0.1                 RCurl_1.98-1.12              
##  [11] ggtree_3.10.0                 htmltools_0.5.6.1            
##  [13] AnnotationHub_3.10.0          curl_5.1.0                   
##  [15] gridGraphics_0.5-1            sass_0.4.7                   
##  [17] bslib_0.5.1                   htmlwidgets_1.6.2            
##  [19] plyr_1.8.9                    plotly_4.10.3                
##  [21] cachem_1.0.8                  igraph_1.5.1                 
##  [23] mime_0.12                     lifecycle_1.0.3              
##  [25] pkgconfig_2.0.3               gson_0.1.0                   
##  [27] Matrix_1.6-1.1                R6_2.5.1                     
##  [29] fastmap_1.1.1                 GenomeInfoDbData_1.2.11      
##  [31] shiny_1.7.5.1                 digest_0.6.33                
##  [33] aplot_0.2.2                   enrichplot_1.22.0            
##  [35] colorspace_2.1-0              patchwork_1.1.3              
##  [37] AnnotationDbi_1.64.0          S4Vectors_0.40.0             
##  [39] RSQLite_2.3.1                 org.Hs.eg.db_3.18.0          
##  [41] MPO.db_0.99.7                 filelock_1.0.2               
##  [43] fansi_1.0.5                   httr_1.4.7                   
##  [45] polyclip_1.10-6               HPO.db_0.99.2                
##  [47] compiler_4.3.1                bit64_4.0.5                  
##  [49] withr_2.5.1                   BiocParallel_1.36.0          
##  [51] viridis_0.6.4                 DBI_1.1.3                    
##  [53] ggforce_0.4.1                 MASS_7.3-60                  
##  [55] rappdirs_0.3.3                HDO.db_0.99.1                
##  [57] tools_4.3.1                   scatterpie_0.2.1             
##  [59] ape_5.7-1                     interactiveDisplayBase_1.40.0
##  [61] httpuv_1.6.12                 glue_1.6.2                   
##  [63] GOSemSim_2.28.0               promises_1.2.1               
##  [65] shadowtext_0.1.2              grid_4.3.1                   
##  [67] reshape2_1.4.4                fgsea_1.28.0                 
##  [69] generics_0.1.3                gtable_0.3.4                 
##  [71] tidyr_1.3.0                   data.table_1.14.8            
##  [73] tidygraph_1.2.3               utf8_1.2.4                   
##  [75] XVector_0.42.0                BiocGenerics_0.48.0          
##  [77] ggrepel_0.9.4                 BiocVersion_3.18.0           
##  [79] pillar_1.9.0                  stringr_1.5.0                
##  [81] yulab.utils_0.1.0             later_1.3.1                  
##  [83] splines_4.3.1                 dplyr_1.1.3                  
##  [85] tweenr_2.0.2                  treeio_1.26.0                
##  [87] BiocFileCache_2.10.0          lattice_0.22-5               
##  [89] bit_4.0.5                     tidyselect_1.2.0             
##  [91] GO.db_3.18.0                  Biostrings_2.70.0            
##  [93] knitr_1.44                    reactome.db_1.86.0           
##  [95] gridExtra_2.3                 bookdown_0.36                
##  [97] IRanges_2.36.0                stats4_4.3.1                 
##  [99] xfun_0.40                     graphlayouts_1.0.1           
## [101] Biobase_2.62.0                stringi_1.7.12               
## [103] lazyeval_0.2.2                ggfun_0.1.3                  
## [105] yaml_2.3.7                    evaluate_0.22                
## [107] codetools_0.2-19              ggraph_2.1.0                 
## [109] tibble_3.2.1                  qvalue_2.34.0                
## [111] BiocManager_1.30.22           ggplotify_0.1.2              
## [113] cli_3.6.1                     ontologyIndex_2.11           
## [115] xtable_1.8-4                  munsell_0.5.0                
## [117] jquerylib_0.1.4               Rcpp_1.0.11                  
## [119] GenomeInfoDb_1.38.0           dbplyr_2.3.4                 
## [121] gprofiler2_0.2.2              png_0.1-8                    
## [123] parallel_4.3.1                ellipsis_0.3.2               
## [125] ggplot2_3.4.4                 blob_1.2.4                   
## [127] clusterProfiler_4.10.0        DOSE_3.28.0                  
## [129] bitops_1.0-7                  tidytree_0.4.5               
## [131] viridisLite_0.4.2             scales_1.2.1                 
## [133] purrr_1.0.2                   crayon_1.5.2                 
## [135] rlang_1.1.1                   cowplot_1.1.1                
## [137] fastmatch_1.1-4               KEGGREST_1.42.0