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: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)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 networkResults 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.
“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.
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.
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.
Finally, a “Reset” button was made to go back to the initial results.
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)sessionInfo()## R version 4.1.1 (2021-08-10)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.14-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.14-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] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
## [1] org.Hs.eg.db_3.14.0  AnnotationDbi_1.56.0 IRanges_2.28.0      
## [4] S4Vectors_0.32.0     Biobase_2.54.0       BiocGenerics_0.40.0 
## [7] famat_1.4.0          BiocStyle_2.22.0    
## 
## loaded via a namespace (and not attached):
##   [1] fgsea_1.20.0           colorspace_2.0-2       ggtree_3.2.0          
##   [4] ellipsis_0.3.2         qvalue_2.26.0          XVector_0.34.0        
##   [7] aplot_0.1.1            farver_2.1.0           graphlayouts_0.7.1    
##  [10] ggrepel_0.9.1          bit64_4.0.5            scatterpie_0.1.7      
##  [13] fansi_0.5.0            splines_4.1.1          cachem_1.0.6          
##  [16] GOSemSim_2.20.0        knitr_1.36             polyclip_1.10-0       
##  [19] jsonlite_1.7.2         GO.db_3.14.0           png_0.1-7             
##  [22] ggforce_0.3.3          BiocManager_1.30.16    compiler_4.1.1        
##  [25] httr_1.4.2             ontologyIndex_2.7      assertthat_0.2.1      
##  [28] Matrix_1.3-4           fastmap_1.1.0          lazyeval_0.2.2        
##  [31] tweenr_1.0.2           htmltools_0.5.2        tools_4.1.1           
##  [34] igraph_1.2.7           gtable_0.3.0           glue_1.4.2            
##  [37] GenomeInfoDbData_1.2.7 reshape2_1.4.4         DO.db_2.9             
##  [40] dplyr_1.0.7            fastmatch_1.1-3        Rcpp_1.0.7            
##  [43] enrichplot_1.14.0      jquerylib_0.1.4        vctrs_0.3.8           
##  [46] Biostrings_2.62.0      ape_5.5                nlme_3.1-153          
##  [49] ggraph_2.0.5           xfun_0.27              stringr_1.4.0         
##  [52] lifecycle_1.0.1        clusterProfiler_4.2.0  MPINet_1.0            
##  [55] DOSE_3.20.0            zlibbioc_1.40.0        MASS_7.3-54           
##  [58] scales_1.1.1           tidygraph_1.2.0        reactome.db_1.77.0    
##  [61] parallel_4.1.1         gprofiler2_0.2.1       RColorBrewer_1.1-2    
##  [64] yaml_2.2.1             curl_4.3.2             memoise_2.0.0         
##  [67] gridExtra_2.3          ggplot2_3.3.5          downloader_0.4        
##  [70] ggfun_0.0.4            yulab.utils_0.0.4      sass_0.4.0            
##  [73] stringi_1.7.5          RSQLite_2.2.8          tidytree_0.3.5        
##  [76] BiocParallel_1.28.0    GenomeInfoDb_1.30.0    rlang_0.4.12          
##  [79] pkgconfig_2.0.3        bitops_1.0-7           evaluate_0.14         
##  [82] lattice_0.20-45        purrr_0.3.4            treeio_1.18.0         
##  [85] patchwork_1.1.1        htmlwidgets_1.5.4      shadowtext_0.0.9      
##  [88] bit_4.0.4              tidyselect_1.1.1       plyr_1.8.6            
##  [91] magrittr_2.0.1         bookdown_0.24          R6_2.5.1              
##  [94] generics_0.1.1         DBI_1.1.1              pillar_1.6.4          
##  [97] mgcv_1.8-38            KEGGREST_1.34.0        RCurl_1.98-1.5        
## [100] tibble_3.1.5           crayon_1.4.1           utf8_1.2.2            
## [103] plotly_4.10.0          rmarkdown_2.11         viridis_0.6.2         
## [106] grid_4.1.1             data.table_1.14.2      blob_1.2.2            
## [109] digest_0.6.28          tidyr_1.1.4            gridGraphics_0.5-1    
## [112] munsell_0.5.0          viridisLite_0.4.0      ggplotify_0.1.0       
## [115] BiasedUrn_1.07         bslib_0.3.1