diffuStats 1.24.0
diffuStats is an R package providing several scores
for diffusion in networks.
While its original purpose lies on biological networks,
its usage is not limited to that scope.
In general terms, diffuStats builds several propagation algorithms
on the  package (Csardi and Nepusz 2006) classes and methods.
A more detailed analysis and documentation of the implemented
methods can be found in the protein function prediction vignette.
To get started, we will load a toy graph included in the package.
library(diffuStats)
data("graph_toy")Let’s take a look in the graph:
graph_toy## IGRAPH 9a7b9df UN-- 48 82 -- Lattice graph
## + attr: name (g/c), dimvector (g/n), nei (g/n), mutual (g/l), circular
## | (g/l), layout (g/n), asp (g/n), input_vec (g/n), input_mat (g/n),
## | output_vec (g/n), output_mat (g/n), input_list (g/x), name (v/c),
## | class (v/c), color (v/c), shape (v/c), frame.color (v/c), label.color
## | (v/c), size (v/n)
## + edges from 9a7b9df (vertex names):
##  [1] A1 --A2  A1 --A9  A2 --A3  A2 --A10 A3 --A4  A3 --A11 A4 --A5  A4 --A12
##  [9] A5 --A6  A5 --A13 A6 --A7  A6 --A14 A7 --A8  A7 --A15 A8 --A16 A9 --A10
## [17] A9 --A17 A10--A11 A10--A18 A11--A12 A11--A19 A12--A13 A12--A20 A13--A14
## [25] A13--A21 A14--A15 A14--A22 A15--A16 A15--A23 A16--A24 A17--A18 A17--A25
## + ... omitted several edgesplot(graph_toy)In the next section, we will be running diffusion algorithms on this tiny lattice graph.
The package diffuStats is flexible and allows
several inputs at once for a given network.
The input format is, in its most general form,
a list of matrices, where each matrix contains
measured nodes in rows and specific scores in columns.
Differents sets of scores may have different backgrounds,
meaning that we can specifically tag sets of nodes as unlabelled.
If we dispose of a unique list of nodes for label propagation,
we should provide a list with a unique column vector
that contains 1’s in the labels in the list and 0’s otherwise.
In this example data, the graph contains one input already.
input_vec <- graph_toy$input_vec
head(input_vec, 15)##  A1  A2  A3  A4  A5  A6  A7  A8  A9 A10 A11 A12 A13 A14 A15 
##   0   0   0   0   0   0   0   0   0   0   0   0   1   0   0Let’s check how many nodes have values
length(input_vec)## [1] 48We see that all the nodes have a measure in each of the four score sets. In practice, these score sets could be disease genes, pathways, et cetera.
Each one of these columns in the input can be smoothed using the network and new value will be derived - unlabelled nodes are also scored. This is the main purpose of diffusion: to derive new scores that intend to keep the same trends as the scores in the input, but taking into account the network structure. Equivalently, this can be regarded as a label propagation where positive and negative examples propagate their labels to their neighbouring nodes.
Let’s start with the simplest case of diffusion: only a vector of values is to be smoothed. Note that these values must be named and must be a subset or all of the graph nodes.
output_vec <- diffuStats::diffuse(
    graph = graph_toy, 
    method = "raw", 
    scores = input_vec)
head(output_vec, 15)##         A1         A2         A3         A4         A5         A6         A7 
## 0.03718927 0.04628679 0.04718643 0.06099494 0.09567369 0.04866964 0.02124098 
##         A8         A9        A10        A11        A12        A13        A14 
## 0.01081382 0.06528103 0.10077145 0.08146401 0.10111963 0.27303017 0.07776389 
##        A15 
## 0.02548044The best way to visualise the scores is overlaying
them in the original lattice.
diffuStats also comes with basic mapping functions
for graphical purposes.
Let’s see an example:
igraph::plot.igraph(
    graph_toy, 
    vertex.color = diffuStats::scores2colours(output_vec),
    vertex.shape = diffuStats::scores2shapes(input_vec),
    main = "Diffusion scores in our lattice"
)Here, we have mapped the scores to colours using scores2colours
and we have highlighted the nodes that were in the
original input using scores2shapes on the original scores.
Square nodes were labelled as relevant in the input,
and the diffusion algorithm smoothed these labels over the network -
as in the guilt-by-association principle.
The input to diffuse can be more than a vector with scores.
It can be provided with a set of score vectors, stored in a matrix
by columns, where rownames should contain
the nodes that are being scored.
As different score sets might have different labelled/unlabelled nodes,
diffuse also accepts a list of score matrices that may have
a different amount of rows.
In this section, we will diffuse using a matrix of scores that contains four sets of scores, with four different names. These example names refer to what the input contains:
input_mat <- graph_toy$input_mat
head(input_mat)##    Single Row Small_sample Large_sample
## A1      1   1            0            1
## A2      0   1            0            0
## A3      0   1            0            1
## A4      0   1            0            1
## A5      0   1            0            0
## A6      0   1            0            0On the other hand, there are a variety of methods
to compute the diffusion scores.
At the moment, the following: raw, ml and gm for
classical propagation; z and mc for scores normalised
through a statistical model, and similarly ber_s and ber_p,
as described in (Bersanelli et al. 2016).
The scoring methods mc and ber_p require permutations
-thus being computationally intense-
whereas the rest are deterministic.
For instance, let’s smooth through mc the input matrix:
output_mc <- diffuStats::diffuse(
    graph = graph_toy, 
    method = "mc", 
    scores = input_mat)
head(output_mc)##       Single       Row Small_sample Large_sample
## A1 0.9999000 0.9877012    0.5414459    0.8330167
## A2 0.9793021 0.9975002    0.5338466    0.5467453
## A3 0.8784122 0.9988001    0.4919508    0.8967103
## A4 0.7387261 0.9997000    0.6132387    0.7349265
## A5 0.5267473 0.9996000    0.7109289    0.3150685
## A6 0.3758624 0.9992001    0.5006499    0.2210779We can plot the result of the fourth column Large_sample:
score_col <- 4
igraph::plot.igraph(
    graph_toy, 
    vertex.color = diffuStats::scores2colours(output_mc[, score_col]),
    vertex.shape = diffuStats::scores2shapes(input_mat[, score_col]),
    main = "Diffusion scores in our lattice"
)Each method has its particularities and, in the end, it is all about the question being asked to the data and the particularities of the dataset.
Package diffuStats offers the option to assess the performance
of the diffusion scores given user-defined target scores or labels.
The validation must be supplied with the same format as
the input scores, but
the labels of the nodes might be different.
For example, we can diffuse labels on all the nodes of a
graph but evaluate using only a specific subset of nodes
and target labels.
A small example: we want to evaluate how good the diffusion scores
raw and ml are at recovering the original labels of the
first 15 nodes
when diffusing in the example network.
df_perf <- perf(
    graph = graph_toy,
    scores = graph_toy$input_mat,
    validation = graph_toy$input_mat[1:15, ],
    grid_param = expand.grid(method = c("raw", "ml")))
df_perf##    auc       Column method
## 1 1.00       Single    raw
## 2 1.00          Row    raw
## 3 1.00 Small_sample    raw
## 4 0.96 Large_sample    raw
## 5 1.00       Single     ml
## 6 1.00          Row     ml
## 7 1.00 Small_sample     ml
## 8 0.96 Large_sample     mlThis indicates that both methods have a very high area under the curve in this example: the ordering of the diffusion scores is very aligned to the class label.
The last example is useful for showing a case in which diffusion scores perform poorly. As the Small_sample and Large_sample positive labels have been randomly assigned ignoring the network, diffusion is not expected to accurately predict one part of the network using as input another disjoint subset of labelled nodes. Thus, if we try to propagate the labels from nodes \(1\) to \(20\) and evaluate the performance using nodes from \(21\) to \(48\), we get a poor result:
df_perf <- perf(
    graph = graph_toy,
    scores = graph_toy$input_mat[1:20, 3:4],
    validation = graph_toy$input_mat[21:48, 3:4],
    grid_param = expand.grid(method = c("raw", "ml")))
df_perf##         auc       Column method
## 1 0.6923077 Small_sample    raw
## 2 0.3437500 Large_sample    raw
## 3 0.4615385 Small_sample     ml
## 4 0.5833333 Large_sample     mlsessionInfo()## R version 4.4.0 beta (2024-04-15 r86425)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 22.04.4 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.19-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_US.UTF-8        LC_COLLATE=en_US.UTF-8    
##  [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] diffuStats_1.24.0 BiocStyle_2.32.0 
## 
## loaded via a namespace (and not attached):
##  [1] Matrix_1.7-0             gtable_0.3.5             expm_0.999-9            
##  [4] jsonlite_1.8.8           highr_0.10               dplyr_1.1.4             
##  [7] compiler_4.4.0           BiocManager_1.30.22      tinytex_0.50            
## [10] tidyselect_1.2.1         Rcpp_1.0.12              magick_2.8.3            
## [13] assertthat_0.2.1         jquerylib_0.1.4          scales_1.3.0            
## [16] yaml_2.3.8               fastmap_1.1.1            lattice_0.22-6          
## [19] ggplot2_3.5.1            R6_2.5.1                 plyr_1.8.9              
## [22] generics_0.1.3           igraph_2.0.3             knitr_1.46              
## [25] MASS_7.3-60.2            backports_1.4.1          tibble_3.2.1            
## [28] checkmate_2.3.1          bookdown_0.39            munsell_0.5.1           
## [31] pillar_1.9.0             bslib_0.7.0              rlang_1.1.3             
## [34] utf8_1.2.4               cachem_1.0.8             xfun_0.43               
## [37] sass_0.4.9               RcppParallel_5.1.7       cli_3.6.2               
## [40] magrittr_2.0.3           digest_0.6.35            grid_4.4.0              
## [43] lifecycle_1.0.4          vctrs_0.6.5              RcppArmadillo_0.12.8.2.1
## [46] evaluate_0.23            glue_1.7.0               data.table_1.15.4       
## [49] fansi_1.0.6              colorspace_2.1-0         rmarkdown_2.26          
## [52] tools_4.4.0              pkgconfig_2.0.3          precrec_0.14.4          
## [55] htmltools_0.5.8.1Bersanelli, Matteo, Ettore Mosca, Daniel Remondini, Gastone Castellani, and Luciano Milanesi. 2016. “Network diffusion-based analysis of high-throughput data for the detection of differentially enriched modules.” Scientific Reports 6 (August): 34841. https://doi.org/10.1038/srep34841.
Csardi, Gabor, and Tamas Nepusz. 2006. “The igraph software package for complex network research.” InterJournal Complex Systems: 1695. http://igraph.org.