For bug reports and maintainer contact details, see the README file
Condition-specific network activation is characteristic for cellular systems and other real-world interaction networks. If measurements of network states are available across a versatile set of conditions or time points, it becomes possible to construct a global view of network activation patterns. Different parts of the network respond to different conditions, and in different ways. Systematic, data-driven identification of these responses will help to obtain a holistic view of network activity [1-2]. This package provides robust probabilistic algorithms for functional network analysis [1, 3].
The methods are based on nonparametric probabilistic modeling and variational learning, and provide general exploratory tools to investigate the structure
NetResponse detects and characterizes subnetworks that exhibit context-specific activation patterns across versatile collections of functional measurements, such as gene expression data. The implementations are partially based on the agglomerative independent variable group analysis (AIVGA) and variational Dirichlet process Gaussian mixture models (Kurihara et al. 2007). The tools are particularly useful for global exploratory analysis of genome-wide interaction networks and versatile collections of gene expression data, and in general to discover subnetworks with alternative states.
Examples on running NetResponse algorithm and visualizing the results. The algorithm combines network and functional information to detect coherent subnetworks that reveal distinct activation modes across conditions.
library(netresponse)
# Generate simulated data
res <- generate.toydata(Dim = 3, Nc = 3, Ns = 200, sd0 = 3, rgam.shape = 1, rgam.scale = 1)
D <- res$data
component.means <- res$means
component.sds   <- res$sds
sample2comp     <- res$sample2comp
# Use fully connected network
network <- matrix(rep(1, 9), nrow = 3) 
# Fit NetResponse model
# Various network formats are supported, see help(detect.responses) for
# details. With large data sets, consider the 'speedup' option.
set.seed(4243)
res <- detect.responses(D, network, mixture.method = "vdp", pca.basis = TRUE)
# List subnets (each is a list of nodes)
subnet.id <- names(get.subnets(res))[[1]]library(ggplot2)
vis <- plot_responses(res, subnet.id, plot_mode = "pca")# Modify the resulting ggplot2 object to enhance visualization
p <- vis$p # Pick the ggplot2 object from results
p <- p + geom_point(size = 3) # Modify point size
print(p) vis <- plot_responses(res, subnet.id, plot_mode = "network")vis <- plot_responses(res, subnet.id, plot_mode = "heatmap")vis <- plot_responses(res, subnet.id, plot_mode = "boxplot_data")See also mode = “response.barplot”
plot_scale(vis$breaks, vis$palette, two.sided = TRUE)The sample-response assignments from the mixture model are soft ie. defined as continuous probabilities. Retrieve the hard clustering ie. list of samples for each response, response for each sample, based the highest probability:
subnet.id <- 'Subnet-1'
# Sample - response probabilities (soft cluster assignment)
response.probs <- sample2response(res, subnet.id)
tail(round(response.probs, 6))##              Mode-1   Mode-2   Mode-3   Mode-4 Mode-5
## Sample-195 1.000000 0.000000 0.000000 0.000000      0
## Sample-196 1.000000 0.000000 0.000000 0.000000      0
## Sample-197 0.986959 0.013041 0.000000 0.000000      0
## Sample-198 0.069342 0.000000 0.421742 0.508917      0
## Sample-199 0.954566 0.000000 0.043585 0.001848      0
## Sample-200 1.000000 0.000000 0.000000 0.000000      0# Sample - response hard assignments
hard.clusters <- response2sample(res, subnet.id)
print(hard.clusters)## $`Mode-1`
##  [1] "Sample-3"   "Sample-10"  "Sample-12"  "Sample-17"  "Sample-18" 
##  [6] "Sample-22"  "Sample-24"  "Sample-25"  "Sample-27"  "Sample-28" 
## [11] "Sample-32"  "Sample-33"  "Sample-34"  "Sample-40"  "Sample-41" 
## [16] "Sample-42"  "Sample-44"  "Sample-45"  "Sample-50"  "Sample-59" 
## [21] "Sample-63"  "Sample-64"  "Sample-67"  "Sample-69"  "Sample-73" 
## [26] "Sample-75"  "Sample-76"  "Sample-77"  "Sample-79"  "Sample-81" 
## [31] "Sample-83"  "Sample-85"  "Sample-87"  "Sample-88"  "Sample-89" 
## [36] "Sample-92"  "Sample-94"  "Sample-95"  "Sample-96"  "Sample-103"
## [41] "Sample-109" "Sample-114" "Sample-116" "Sample-117" "Sample-122"
## [46] "Sample-126" "Sample-130" "Sample-132" "Sample-134" "Sample-135"
## [51] "Sample-137" "Sample-142" "Sample-147" "Sample-148" "Sample-152"
## [56] "Sample-153" "Sample-154" "Sample-155" "Sample-157" "Sample-162"
## [61] "Sample-163" "Sample-164" "Sample-167" "Sample-168" "Sample-176"
## [66] "Sample-179" "Sample-181" "Sample-182" "Sample-184" "Sample-187"
## [71] "Sample-188" "Sample-193" "Sample-194" "Sample-196" "Sample-198"
## [76] "Sample-199"
## 
## $`Mode-2`
##  [1] "Sample-1"   "Sample-4"   "Sample-8"   "Sample-14"  "Sample-16" 
##  [6] "Sample-20"  "Sample-23"  "Sample-26"  "Sample-31"  "Sample-35" 
## [11] "Sample-36"  "Sample-37"  "Sample-38"  "Sample-43"  "Sample-46" 
## [16] "Sample-51"  "Sample-53"  "Sample-55"  "Sample-58"  "Sample-62" 
## [21] "Sample-65"  "Sample-68"  "Sample-70"  "Sample-74"  "Sample-78" 
## [26] "Sample-82"  "Sample-90"  "Sample-93"  "Sample-101" "Sample-104"
## [31] "Sample-106" "Sample-107" "Sample-108" "Sample-110" "Sample-112"
## [36] "Sample-115" "Sample-119" "Sample-121" "Sample-123" "Sample-127"
## [41] "Sample-129" "Sample-131" "Sample-133" "Sample-138" "Sample-139"
## [46] "Sample-141" "Sample-143" "Sample-144" "Sample-159" "Sample-165"
## [51] "Sample-166" "Sample-169" "Sample-171" "Sample-172" "Sample-177"
## [56] "Sample-180" "Sample-183" "Sample-186" "Sample-195" "Sample-200"
## 
## $`Mode-3`
##  [1] "Sample-5"   "Sample-9"   "Sample-15"  "Sample-19"  "Sample-21" 
##  [6] "Sample-30"  "Sample-39"  "Sample-47"  "Sample-48"  "Sample-49" 
## [11] "Sample-52"  "Sample-54"  "Sample-56"  "Sample-60"  "Sample-61" 
## [16] "Sample-66"  "Sample-71"  "Sample-72"  "Sample-80"  "Sample-84" 
## [21] "Sample-86"  "Sample-91"  "Sample-98"  "Sample-99"  "Sample-102"
## [26] "Sample-105" "Sample-118" "Sample-125" "Sample-128" "Sample-136"
## [31] "Sample-140" "Sample-145" "Sample-146" "Sample-149" "Sample-150"
## [36] "Sample-151" "Sample-158" "Sample-161" "Sample-174" "Sample-175"
## [41] "Sample-178" "Sample-189" "Sample-191" "Sample-197"
## 
## $`Mode-4`
##  [1] "Sample-7"   "Sample-11"  "Sample-13"  "Sample-29"  "Sample-100"
##  [6] "Sample-113" "Sample-124" "Sample-156" "Sample-160" "Sample-170"
## [11] "Sample-190" "Sample-192"
## 
## $`Mode-5`
## [1] "Sample-2"   "Sample-6"   "Sample-57"  "Sample-97"  "Sample-111"
## [6] "Sample-120" "Sample-173" "Sample-185"Retrieve model parameters for a given subnetwork (Gaussian mixture means, covariance diagonal, and component weights; see help(get.model.parameters) for details):
params <- get.model.parameters(res, subnet.id) 
names(params)## [1] "mu"          "sd"          "w"           "free.energy" "Nparams"    
## [6] "qofz"        "nodes"Nonparametric Gaussian mixtures with variational Dirichlet processes based on implementations by Kurihara et al. (2007) and Honkela et al..
# Generate 2-dimensional simulated data with 3 clusters
res <- generate.toydata(Dim = 2, Nc = 3, Ns = 200, sd0 = 3, rgam.shape = 1, rgam.scale = 1)
D <- res$data
real.means <- res$means
real.sds   <- res$sds
real.sample2comp     <- res$sample2comp
# Infinite Gaussian mixture model with       
# Variational Dirichlet Process approximation       
mixt <- vdp.mixt( D )
            
# Centroids of the detected Gaussian components       
estimated.means <- mixt$posterior$centroids
# The colors denote the known clusters
# The blue ball denotes the original (known) cluster centroids and
# the triangle denotes the estimated centroids
plot(D, col = real.sample2comp, pch = 1)
points(real.means, col = "blue", pch = 16, cex = 2)
points(estimated.means, col = "blue", pch = 17, cex = 2)# Hard mixture component assignment for each sample
estimated.sample2comp <- apply(mixt$posterior$qOFz, 1, which.max)
# Compare known and estimated mixture components
# (note that cluster indices may have switched due to unidentifiability)
# nearly all samples have one-to-one match between the real and estimated 
# clusters
head(table(estimated.sample2comp, real.sample2comp))##                      real.sample2comp
## estimated.sample2comp  1  2  3
##                     1 64 60  1
##                     2  0  0 75Please cite Lahti et al. (2010) with the package.
citation("netresponse")## 
## To cite netrespose (algorithm and package) in publications use:
## 
##   Leo Lahti et al. Global modeling of transcriptional responses in
##   interaction networks Bioinformatics 26(21):2713--20, 2010.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Global modeling of transcriptional responses in interaction networks},
##     author = {Leo Lahti and Juha E.A. Knuuttila and Samuel Kaski},
##     journal = {Bioinformatics},
##     year = {2010},
##     volume = {26},
##     issue = {21},
##     pages = {2713--20},
##   }
## 
## For ICMg functionality, please cite additionally the references listed
## in help(ICMg.combined.sampler). Thanks for Olli-Pekka Huovilainen and
## Antonio Gusmao for contributions to the R/C implementation of the
## netresponse algorithm and Juuso Parkkinen for ICMg.This document was written using:
sessionInfo()## R version 4.0.0 (2020-04-24)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.4 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.11-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.11-bioc/R/lib/libRlapack.so
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_US.UTF-8        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] grid      parallel  stats     graphics  grDevices utils     datasets 
## [8] methods   base     
## 
## other attached packages:
## [1] netresponse_1.48.0  reshape2_1.4.4      mclust_5.4.6       
## [4] minet_3.46.0        Rgraphviz_2.32.0    graph_1.66.0       
## [7] BiocGenerics_0.34.0 knitr_1.28          BiocStyle_2.16.0   
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_1.0.4.6        pillar_1.4.3        compiler_4.0.0     
##  [4] RColorBrewer_1.1-2  BiocManager_1.30.10 plyr_1.8.6         
##  [7] tools_4.0.0         digest_0.6.25       dmt_0.8.20         
## [10] tibble_3.0.1        evaluate_0.14       lifecycle_0.2.0    
## [13] gtable_0.3.0        lattice_0.20-41     pkgconfig_2.0.3    
## [16] rlang_0.4.5         igraph_1.2.5        Matrix_1.2-18      
## [19] magick_2.3          yaml_2.2.1          mvtnorm_1.1-0      
## [22] xfun_0.13           dplyr_0.8.5         stringr_1.4.0      
## [25] vctrs_0.2.4         tidyselect_1.0.0    stats4_4.0.0       
## [28] qvalue_2.20.0       glue_1.4.0          R6_2.4.1           
## [31] rmarkdown_2.1       bookdown_0.18       purrr_0.3.4        
## [34] ggplot2_3.3.0       magrittr_1.5        splines_4.0.0      
## [37] ellipsis_0.3.0      scales_1.1.0        htmltools_0.4.0    
## [40] MASS_7.3-51.6       assertthat_0.2.1    colorspace_1.4-1   
## [43] stringi_1.4.6       munsell_0.5.0       crayon_1.3.4