| Back to Multiple platform build/check report for BioC 3.8 | 
 | 
This page was generated on 2019-04-16 11:55:20 -0400 (Tue, 16 Apr 2019).
| Package 1052/1649 | Hostname | OS / Arch | INSTALL | BUILD | CHECK | BUILD BIN | ||||||
| netresponse 1.42.0 Leo Lahti 
 | malbec1 | Linux (Ubuntu 16.04.6 LTS) / x86_64 | OK | OK | WARNINGS |  | ||||||
| merida1 | OS X 10.11.6 El Capitan / x86_64 | OK | OK | [ WARNINGS ] | OK |  | 
| Package: netresponse | 
| Version: 1.42.0 | 
| Command: /Library/Frameworks/R.framework/Versions/Current/Resources/bin/R CMD check --install=check:netresponse.install-out.txt --library=/Library/Frameworks/R.framework/Versions/Current/Resources/library --no-vignettes --timings netresponse_1.42.0.tar.gz | 
| StartedAt: 2019-04-16 01:35:29 -0400 (Tue, 16 Apr 2019) | 
| EndedAt: 2019-04-16 01:39:36 -0400 (Tue, 16 Apr 2019) | 
| EllapsedTime: 246.9 seconds | 
| RetCode: 0 | 
| Status: WARNINGS | 
| CheckDir: netresponse.Rcheck | 
| Warnings: 1 | 
##############################################################################
##############################################################################
###
### Running command:
###
###   /Library/Frameworks/R.framework/Versions/Current/Resources/bin/R CMD check --install=check:netresponse.install-out.txt --library=/Library/Frameworks/R.framework/Versions/Current/Resources/library --no-vignettes --timings netresponse_1.42.0.tar.gz
###
##############################################################################
##############################################################################
* using log directory ‘/Users/biocbuild/bbs-3.8-bioc/meat/netresponse.Rcheck’
* using R version 3.5.3 (2019-03-11)
* using platform: x86_64-apple-darwin15.6.0 (64-bit)
* using session charset: UTF-8
* using option ‘--no-vignettes’
* checking for file ‘netresponse/DESCRIPTION’ ... OK
* checking extension type ... Package
* this is package ‘netresponse’ version ‘1.42.0’
* checking package namespace information ... OK
* checking package dependencies ... OK
* checking if this is a source package ... OK
* checking if there is a namespace ... OK
* checking for hidden files and directories ... OK
* checking for portable file names ... OK
* checking for sufficient/correct file permissions ... OK
* checking whether package ‘netresponse’ can be installed ... OK
* checking installed package size ... OK
* checking package directory ... OK
* checking DESCRIPTION meta-information ... OK
* checking top-level files ... OK
* checking for left-over files ... OK
* checking index information ... OK
* checking package subdirectories ... OK
* checking R files for non-ASCII characters ... OK
* checking R files for syntax errors ... OK
* checking whether the package can be loaded ... OK
* checking whether the package can be loaded with stated dependencies ... OK
* checking whether the package can be unloaded cleanly ... OK
* checking whether the namespace can be loaded with stated dependencies ... OK
* checking whether the namespace can be unloaded cleanly ... OK
* checking dependencies in R code ... OK
* checking S3 generic/method consistency ... OK
* checking replacement functions ... OK
* checking foreign function calls ... OK
* checking R code for possible problems ... OK
* checking Rd files ... OK
* checking Rd metadata ... OK
* checking Rd cross-references ... OK
* checking for missing documentation entries ... OK
* checking for code/documentation mismatches ... OK
* checking Rd \usage sections ... OK
* checking Rd contents ... OK
* checking for unstated dependencies in examples ... OK
* checking contents of ‘data’ directory ... OK
* checking data for non-ASCII characters ... OK
* checking data for ASCII and uncompressed saves ... OK
* checking line endings in C/C++/Fortran sources/headers ... OK
* checking line endings in Makefiles ... OK
* checking compilation flags in Makevars ... OK
* checking for GNU extensions in Makefiles ... OK
* checking for portable use of $(BLAS_LIBS) and $(LAPACK_LIBS) ... OK
* checking compiled code ... OK
* checking files in ‘vignettes’ ... WARNING
Files in the 'vignettes' directory but no files in 'inst/doc':
  ‘NetResponse.Rmd’, ‘NetResponse.md’, ‘TODO/TODO.Rmd’,
    ‘fig/NetResponse2-1.png’, ‘fig/NetResponse2b-1.png’,
    ‘fig/NetResponse3-1.png’, ‘fig/NetResponse4-1.png’,
    ‘fig/NetResponse5-1.png’, ‘fig/NetResponse7-1.png’,
    ‘fig/vdp-1.png’, ‘main.R’, ‘netresponse.bib’, ‘netresponse.pdf’
Package has no Sweave vignette sources and no VignetteBuilder field.
* checking examples ... OK
Examples with CPU or elapsed time > 5s
                        user system elapsed
ICMg.combined.sampler 38.109  0.091  38.896
* checking for unstated dependencies in ‘tests’ ... OK
* checking tests ...
  Running ‘ICMg.test.R’
  Running ‘bicmixture.R’
  Running ‘mixture.model.test.R’
  Running ‘mixture.model.test.multimodal.R’
  Running ‘mixture.model.test.singlemode.R’
  Running ‘timing.R’
  Running ‘toydata2.R’
  Running ‘validate.netresponse.R’
  Running ‘validate.pca.basis.R’
  Running ‘vdpmixture.R’
 OK
* checking PDF version of manual ... OK
* DONE
Status: 1 WARNING
See
  ‘/Users/biocbuild/bbs-3.8-bioc/meat/netresponse.Rcheck/00check.log’
for details.
netresponse.Rcheck/00install.out
##############################################################################
##############################################################################
###
### Running command:
###
###   /Library/Frameworks/R.framework/Versions/Current/Resources/bin/R CMD INSTALL netresponse
###
##############################################################################
##############################################################################
* installing to library ‘/Library/Frameworks/R.framework/Versions/3.5/Resources/library’
* installing *source* package ‘netresponse’ ...
** libs
clang -I"/Library/Frameworks/R.framework/Resources/include" -DNDEBUG   -I/usr/local/include   -fPIC  -Wall -g -O2  -c netresponse.c -o netresponse.o
netresponse.c:264:15: warning: unused variable 'prior_fields' [-Wunused-variable]
  const char *prior_fields[]={"Mumu","S2mu",
              ^
netresponse.c:686:6: warning: variable 'Mumu' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim1) {
     ^˜˜˜
netresponse.c:713:21: note: uninitialized use occurs here
  vdp_mk_log_lambda(Mumu, S2mu, Mubar, Mutilde, 
                    ^˜˜˜
netresponse.c:686:3: note: remove the 'if' if its condition is always true
  if(dim1) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:655:15: note: initialize the variable 'Mumu' to silence this warning
  double *Mumu, *S2mu, *Mubar, *Mutilde, 
              ^
               = NULL
netresponse.c:686:6: warning: variable 'S2mu' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim1) {
     ^˜˜˜
netresponse.c:713:27: note: uninitialized use occurs here
  vdp_mk_log_lambda(Mumu, S2mu, Mubar, Mutilde, 
                          ^˜˜˜
netresponse.c:686:3: note: remove the 'if' if its condition is always true
  if(dim1) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:655:22: note: initialize the variable 'S2mu' to silence this warning
  double *Mumu, *S2mu, *Mubar, *Mutilde, 
                     ^
                      = NULL
netresponse.c:686:6: warning: variable 'Mubar' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim1) {
     ^˜˜˜
netresponse.c:713:33: note: uninitialized use occurs here
  vdp_mk_log_lambda(Mumu, S2mu, Mubar, Mutilde, 
                                ^˜˜˜˜
netresponse.c:686:3: note: remove the 'if' if its condition is always true
  if(dim1) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:655:30: note: initialize the variable 'Mubar' to silence this warning
  double *Mumu, *S2mu, *Mubar, *Mutilde, 
                             ^
                              = NULL
netresponse.c:686:6: warning: variable 'Mutilde' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim1) {
     ^˜˜˜
netresponse.c:713:40: note: uninitialized use occurs here
  vdp_mk_log_lambda(Mumu, S2mu, Mubar, Mutilde, 
                                       ^˜˜˜˜˜˜
netresponse.c:686:3: note: remove the 'if' if its condition is always true
  if(dim1) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:655:40: note: initialize the variable 'Mutilde' to silence this warning
  double *Mumu, *S2mu, *Mubar, *Mutilde, 
                                       ^
                                        = NULL
netresponse.c:686:6: warning: variable 'AlphaKsi' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim1) {
     ^˜˜˜
netresponse.c:714:7: note: uninitialized use occurs here
                    AlphaKsi, BetaKsi, KsiAlpha, KsiBeta, 
                    ^˜˜˜˜˜˜˜
netresponse.c:686:3: note: remove the 'if' if its condition is always true
  if(dim1) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:656:14: note: initialize the variable 'AlphaKsi' to silence this warning
    *AlphaKsi, *BetaKsi, *KsiAlpha, *KsiBeta, *U_p, *prior_alpha,
             ^
              = NULL
netresponse.c:686:6: warning: variable 'BetaKsi' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim1) {
     ^˜˜˜
netresponse.c:714:17: note: uninitialized use occurs here
                    AlphaKsi, BetaKsi, KsiAlpha, KsiBeta, 
                              ^˜˜˜˜˜˜
netresponse.c:686:3: note: remove the 'if' if its condition is always true
  if(dim1) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:656:24: note: initialize the variable 'BetaKsi' to silence this warning
    *AlphaKsi, *BetaKsi, *KsiAlpha, *KsiBeta, *U_p, *prior_alpha,
                       ^
                        = NULL
netresponse.c:686:6: warning: variable 'KsiAlpha' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim1) {
     ^˜˜˜
netresponse.c:714:26: note: uninitialized use occurs here
                    AlphaKsi, BetaKsi, KsiAlpha, KsiBeta, 
                                       ^˜˜˜˜˜˜˜
netresponse.c:686:3: note: remove the 'if' if its condition is always true
  if(dim1) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:656:35: note: initialize the variable 'KsiAlpha' to silence this warning
    *AlphaKsi, *BetaKsi, *KsiAlpha, *KsiBeta, *U_p, *prior_alpha,
                                  ^
                                   = NULL
netresponse.c:686:6: warning: variable 'KsiBeta' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim1) {
     ^˜˜˜
netresponse.c:714:36: note: uninitialized use occurs here
                    AlphaKsi, BetaKsi, KsiAlpha, KsiBeta, 
                                                 ^˜˜˜˜˜˜
netresponse.c:686:3: note: remove the 'if' if its condition is always true
  if(dim1) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:656:45: note: initialize the variable 'KsiBeta' to silence this warning
    *AlphaKsi, *BetaKsi, *KsiAlpha, *KsiBeta, *U_p, *prior_alpha,
                                            ^
                                             = NULL
netresponse.c:696:6: warning: variable 'U_p' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim2) {
     ^˜˜˜
netresponse.c:716:7: note: uninitialized use occurs here
                    U_p, U_hat,
                    ^˜˜
netresponse.c:696:3: note: remove the 'if' if its condition is always true
  if(dim2) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:656:51: note: initialize the variable 'U_p' to silence this warning
    *AlphaKsi, *BetaKsi, *KsiAlpha, *KsiBeta, *U_p, *prior_alpha,
                                                  ^
                                                   = NULL
netresponse.c:696:6: warning: variable 'U_hat' is used uninitialized whenever 'if' condition is false [-Wsometimes-uninitialized]
  if(dim2) {
     ^˜˜˜
netresponse.c:716:12: note: uninitialized use occurs here
                    U_p, U_hat,
                         ^˜˜˜˜
netresponse.c:696:3: note: remove the 'if' if its condition is always true
  if(dim2) {
  ^˜˜˜˜˜˜˜˜
netresponse.c:661:14: note: initialize the variable 'U_hat' to silence this warning
  SEXP* U_hat;
             ^
              = NULL
11 warnings generated.
clang -dynamiclib -Wl,-headerpad_max_install_names -undefined dynamic_lookup -single_module -multiply_defined suppress -L/Library/Frameworks/R.framework/Resources/lib -L/usr/local/lib -o netresponse.so netresponse.o -F/Library/Frameworks/R.framework/.. -framework R -Wl,-framework -Wl,CoreFoundation
installing to /Library/Frameworks/R.framework/Versions/3.5/Resources/library/netresponse/libs
** R
** data
** inst
** byte-compile and prepare package for lazy loading
** help
*** installing help indices
** building package indices
** installing vignettes
** testing if installed package can be loaded
* DONE (netresponse)
netresponse.Rcheck/tests/bicmixture.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> # 1. vdp.mixt: moodien loytyminen eri dimensiolla, naytemaarilla ja komponenteilla
> #   -> ainakin nopea check
> 
> #######################################################################
> 
> # Generate random data from five Gaussians. 
> # Detect modes with vdp-gm. 
> # Plot data points and detected clusters with variance ellipses
> 
> #######################################################################
> 
> library(netresponse)
Loading required package: Rgraphviz
Loading required package: graph
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
    clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
    IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
    Filter, Find, Map, Position, Reduce, anyDuplicated, append,
    as.data.frame, basename, cbind, colMeans, colSums, colnames,
    dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
    intersect, is.unsorted, lapply, lengths, mapply, match, mget,
    order, paste, pmax, pmax.int, pmin, pmin.int, rank, rbind,
    rowMeans, rowSums, rownames, sapply, setdiff, sort, table, tapply,
    union, unique, unsplit, which, which.max, which.min
Loading required package: grid
Loading required package: minet
Loading required package: mclust
Package 'mclust' version 5.4.3
Type 'citation("mclust")' for citing this R package in publications.
Loading required package: reshape2
netresponse (C) 2008-2016 Leo Lahti et al.
https://github.com/antagomir/netresponse
> #source("˜/Rpackages/netresponse/netresponse/R/detect.responses.R")
> #source("˜/Rpackages/netresponse/netresponse/R/internals.R")
> #source("˜/Rpackages/netresponse/netresponse/R/vdp.mixt.R")
> #dyn.load("/home/tuli/Rpackages/netresponse/netresponse/src/netresponse.so")
> 
> #########  Generate DATA #############################################
> 
> # Generate Nc components from normal-inverseGamma prior
> 
> set.seed(12346)
> 
> dd <- 3   # Dimensionality of data
> Nc <- 5   # Number of components
> Ns <- 200 # Number of data points
> sd0 <- 3  # component spread
> rgam.shape = 2 # parameters for Gamma distribution 
> rgam.scale = 2 # parameters for Gamma distribution to define precisions
> 
> 
> # Generate means and variances (covariance diagonals) for the components 
> component.means <- matrix(rnorm(Nc*dd, mean = 0, sd = sd0), nrow = Nc, ncol = dd)
> component.vars <- matrix(1/rgamma(Nc*dd, shape = rgam.shape, scale = rgam.scale), 
+ 	                 nrow = Nc, ncol = dd)
> component.sds <- sqrt(component.vars)
> 
> 
> # Size for each component -> sample randomly for each data point from uniform distr.
> # i.e. cluster assignments
> sample2comp <- sample.int(Nc, Ns, replace = TRUE)
> 
> D <- array(NA, dim = c(Ns, dd))
> for (i in 1:Ns)  {
+     # component identity of this sample
+     ci <- sample2comp[[i]]
+     cm <- component.means[ci,]
+     csd <- component.sds[ci,]
+     D[i,] <- rnorm(dd, mean = cm, sd = csd)
+ }
> 
> 
> ######################################################################
> 
> # Fit mixture model
> out <- mixture.model(D, mixture.method = "bic")
> 
> # FIXME rowmeans(qofz) is constant but not 1
> #qofz <- P.r.s(t(D), list(mu = out$mu, sd = out$sd, w = out$w), log = FALSE)
> 
> ############################################################
> 
> # Compare input data and results
> 
> ord.out <- order(out$mu[,1])
> ord.in <- order(component.means[,1])
> 
> means.out <- out$mu[ord.out,]
> means.in <- component.means[ord.in,]
> 
> # Cluster stds and variances
> sds.out <- out$sd[ord.out,]
> sds.in  <- sqrt(component.vars[ord.in,])
> 
> # -----------------------------------------------------------
> 
> vars.out <- sds.out^2
> vars.in <- sds.in^2
> 
> # Check correspondence between input and output
> if (length(means.in) == length(means.out)) {
+    cm <- cor(as.vector(means.in), as.vector(means.out))
+    csd <- cor(as.vector(sds.in), as.vector(sds.out))
+ }
> 
> # Plot results (assuming 2D)
> 
> ran <- range(c(as.vector(means.in - 2*vars.in), 
+                as.vector(means.in + 2*vars.in), 
+ 	       as.vector(means.out + 2*vars.out), 
+ 	       as.vector(means.out - 2*vars.out)))
> 
> plot(D, pch = 20, main = paste("Cor.means:", round(cm,3), "/ Cor.sds:", round(csd,3)), xlim = ran, ylim = ran) 
> for (ci in 1:nrow(means.out))  { add.ellipse(centroid = means.out[ci,], covmat = diag(vars.out[ci,]), col = "red") }
> for (ci in 1:nrow(means.in))  { add.ellipse(centroid = means.in[ci,], covmat = diag(vars.in[ci,]), col = "blue") }
> 
> ######################################################
> 
> #for (ci in 1:nrow(means.out))  {
> #    points(means.out[ci,1], means.out[ci,2], col = "red", pch = 19)
> #    el <- ellipse(matrix(c(vars.out[ci,1],0,0,vars.out[ci,2]),2), centre = means.out[ci,])
> #    lines(el, col = "red") 						  
> #}
> 
> #for (ci in 1:nrow(means.in))  {
> #    points(means.in[ci,1], means.in[ci,2], col = "blue", pch = 19)
> #    el <- ellipse(matrix(c(vars.in[ci,1],0,0,vars.in[ci,2]),2), centre = means.in[ci,])
> #    lines(el, col = "blue") 						  
> #}
> 
> 
> 
> 
> 
> 
> proc.time()
   user  system elapsed 
  4.206   0.286   4.769 
netresponse.Rcheck/tests/ICMg.test.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> # Test script for the ICMg method
> 
> # Load the package
> library(netresponse)
Loading required package: Rgraphviz
Loading required package: graph
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
    clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
    IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
    Filter, Find, Map, Position, Reduce, anyDuplicated, append,
    as.data.frame, basename, cbind, colMeans, colSums, colnames,
    dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
    intersect, is.unsorted, lapply, lengths, mapply, match, mget,
    order, paste, pmax, pmax.int, pmin, pmin.int, rank, rbind,
    rowMeans, rowSums, rownames, sapply, setdiff, sort, table, tapply,
    union, unique, unsplit, which, which.max, which.min
Loading required package: grid
Loading required package: minet
Loading required package: mclust
Package 'mclust' version 5.4.3
Type 'citation("mclust")' for citing this R package in publications.
Loading required package: reshape2
netresponse (C) 2008-2016 Leo Lahti et al.
https://github.com/antagomir/netresponse
> 
> data(osmo) # Load data
> 
> # Set parameters
> C.boost = 1
> alpha = 10
> beta = 0.01
> B.num = 10
> B.size = 10
> S.num = 10  
> S.size = 10
> C = 24
> pm0 = 0
> V0 = 1               
> V = 0.1
> 
> # Run combined ICMg sampler
> res = ICMg.combined.sampler(osmo$ppi, osmo$exp, C, alpha, beta, pm0, V0, V, B.num, B.size, S.num, S.size, C.boost) 
Sampling ICMg2...
nodes:10250links:1711observations:133components:24alpha:10beta:0.01
Sampling200iterationcs
Burnin iterations:100
I: 0
n(z):403440454425400404405416399501399455434438433443413394448397469432441407
m(z):777866707770667469707471597775717070767265748060
I:10
convL:-0.481318058628818n(z):3182343823572046249531234281569294392367217581230184400435307513348183598
convN:-0.00568692632429765m(z):4279674016729133455650617910152125534658685984972892
I:20
convL:-0.40929443198654n(z):3041912824112150237548233343595307362382216789238161365425254351261157688
convN:-0.00521541622382213m(z):4375664017129129445648607810151129504065706278944191
I:30
convL:-0.376846891568311n(z):32918522831920352555102543405102743983912161049215107377392214376330154792
convN:-0.00408424640849912m(z):4674564116229125455648617910751131494066706177984693
I:40
convL:-0.356992389697301n(z):34518023029720662335042623475122423893802101088193121366403215345353167802
convN:-0.00534580784964558m(z):4972464115829123465752608011154131504163716175994993
I:50
convL:-0.344857909683817n(z):32917522027219312655052693334402093653682641239197130352384171361340186945
convN:-0.00409111593324286m(z):50714542156291244657526080111541325041627061751034793
I:60
convL:-0.340647312808381n(z):33418623223918862235422633213892173283582581340210107354358187420343171984
convN:-0.00792254207688362m(z):50724542155291244657526080111551315041627061761034693
I:70
convL:-0.34532047208987n(z):331209221240188123953827534236222034134628013132151393513311794112941801012
convN:-0.00406686815383472m(z):50714542153291244557526080111551345042627061751054692
I:80
convL:-0.338438898891824n(z):288179245249184225952425033636020834832928513772281163433871913982911801037
convN:-0.0023844536436051m(z):50724542152291244657526080111561345140627061751044593
I:90
convL:-0.339912399853246n(z):346187231205185126157526035730521033832229213992171043413361773793041671086
convN:-0.00433882896139215m(z):50724542155291234557526080110561335141637061751024693
I:100
convL:-0.340364735902995n(z):260180218202177926455728233928121834032028714602091313413842133813141581132
convN:-0.00255041187797189m(z):50734542154281234657525980111561335140627061751044693
Sample iterations:100
I:110
convL:-0.342118584090409n(z):267184220227171424952430035825619234327328115332131263443522084202902311145
convN:-0.00481799796039126m(z):50734542152281234657525980110561345140637061751054693
I:120
convL:-0.325962321742018n(z):292188218231169325056026133824817634225926415742161313453712244392872081135
convN:-0.00722357478589036m(z):50734542154281244557526080111561345041627061751034593
I:130
convL:-0.327061874098617n(z):265175230220170225555826336224117938626025616101741403533602124352662251123
convN:-0.00648825316014452m(z):50734542155281234557525980111561345141627061751024693
I:140
convL:-0.325759068281021n(z):264173229229164926857026435725416234229326116171831253543652064532932141125
convN:-0.00463076868352298m(z):50724542153291244557526080110561355141637061751024593
I:150
convL:-0.32456152244371n(z):238195244213159926656225735922113833627123416292051313653492294513142521192
convN:-0.00519068098677699m(z):50724542154291244557526080111551365141627061751014593
I:160
convL:-0.328414276146583n(z):241182251216155327154028137223615135826020216861881343663802164632822191202
convN:-0.0054227012118432m(z):50724542156291244558526080110561325141627061761014593
I:170
convL:-0.322911766313031n(z):251190221205162725053930236320016438227518616451841423663822075022582381171
convN:-0.00426617290457587m(z):50714542153291244557526079112561335042627061761034693
I:180
convL:-0.326835170607796n(z):272204257193165926855625636817617739529320216251821263553872344372622041162
convN:-0.00146943588511001m(z):50734542155281244557525980111561345041627061751024693
I:190
convL:-0.316402591208641n(z):251202252185160727854828335018517135027419516631961493853892484932721941130
convN:-0.00516420863873699m(z):50734542155281244658525980110561335040627061761024693
I:200
convL:-0.327038545620124n(z):252211236184165426553928833919117338227018316561851183933742394813031991135
convN:-0.00249282762312576m(z):50734542156281244657525980111561325040627061761034692
DONE
> 
> # Compute component membership probabilities for the data points
> res$comp.memb <- ICMg.get.comp.memberships(osmo$ppi, res)
> 
> # Compute (hard) clustering for nodes
> res$clustering <- apply(res$comp.memb, 2, which.max)
> 
> proc.time()
   user  system elapsed 
 10.481   0.315  11.212 
netresponse.Rcheck/tests/mixture.model.test.multimodal.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> library(netresponse)
Loading required package: Rgraphviz
Loading required package: graph
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
    clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
    IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
    Filter, Find, Map, Position, Reduce, anyDuplicated, append,
    as.data.frame, basename, cbind, colMeans, colSums, colnames,
    dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
    intersect, is.unsorted, lapply, lengths, mapply, match, mget,
    order, paste, pmax, pmax.int, pmin, pmin.int, rank, rbind,
    rowMeans, rowSums, rownames, sapply, setdiff, sort, table, tapply,
    union, unique, unsplit, which, which.max, which.min
Loading required package: grid
Loading required package: minet
Loading required package: mclust
Package 'mclust' version 5.4.3
Type 'citation("mclust")' for citing this R package in publications.
Loading required package: reshape2
netresponse (C) 2008-2016 Leo Lahti et al.
https://github.com/antagomir/netresponse
> 
> # Three MODES
> 
> # set.seed(34884)
> set.seed(3488400)
> 
> Ns <- 200
> Nd <- 2
> 
> D3 <- rbind(matrix(rnorm(Ns*Nd, mean = 0), ncol = Nd), 
+       	    matrix(rnorm(Ns*Nd, mean = 3), ncol = Nd),
+       	    cbind(rnorm(Ns, mean = -3), rnorm(Ns, mean = 3))
+ 	    )
> 
> #X11()
> par(mfrow = c(2,2))
> for (mm in c("vdp", "bic")) {
+   for (pp in c(FALSE, TRUE)) {
+ 
+     # Fit nonparametric Gaussian mixture model
+     out <- mixture.model(D3, mixture.method = mm, pca.basis = pp)
+     plot(D3, col = apply(out$qofz, 1, which.max), main = paste(mm, "/ pca:",  pp)) 
+ 
+   }
+ }
> 
> # VDP is less sensitive than BIC in detecting Gaussian modes (more
> # separation between the clusters needed)
> 
> # pca.basis option is less important for sensitive detection but
> # it will help to avoid overfitting to unimodal features that
> # are not parallel to the axes (unimodal distribution often becomes
> # splitted in two or more clusters in these cases)
> 
> 
> proc.time()
   user  system elapsed 
  6.234   0.299   6.749 
netresponse.Rcheck/tests/mixture.model.test.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> # Validate mixture models
> 
> # Generate random data from five Gaussians. 
> # Detect modes 
> # Plot data points and detected clusters 
> 
> library(netresponse)
Loading required package: Rgraphviz
Loading required package: graph
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
    clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
    IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
    Filter, Find, Map, Position, Reduce, anyDuplicated, append,
    as.data.frame, basename, cbind, colMeans, colSums, colnames,
    dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
    intersect, is.unsorted, lapply, lengths, mapply, match, mget,
    order, paste, pmax, pmax.int, pmin, pmin.int, rank, rbind,
    rowMeans, rowSums, rownames, sapply, setdiff, sort, table, tapply,
    union, unique, unsplit, which, which.max, which.min
Loading required package: grid
Loading required package: minet
Loading required package: mclust
Package 'mclust' version 5.4.3
Type 'citation("mclust")' for citing this R package in publications.
Loading required package: reshape2
netresponse (C) 2008-2016 Leo Lahti et al.
https://github.com/antagomir/netresponse
> 
> #fs <- list.files("˜/Rpackages/netresponse/netresponse/R/", full.names = TRUE); for (f in fs) {source(f)}; dyn.load("/home/tuli/Rpackages/netresponse/netresponse/src/netresponse.so")
> 
> #########  Generate DATA #######################
> 
> res <- generate.toydata()
> D <- res$data
> component.means <- res$means
> component.sds   <- res$sds
> sample2comp     <- res$sample2comp
> 
> ######################################################################
> 
> par(mfrow = c(2,1))
> 
> for (mm in c("vdp", "bic")) {
+ 
+   # Fit nonparametric Gaussian mixture model
+   #source("˜/Rpackages/netresponse/netresponse/R/vdp.mixt.R")
+   out <- mixture.model(D, mixture.method = mm, max.responses = 10, pca.basis = FALSE)
+ 
+   ############################################################
+ 
+   # Compare input data and results
+ 
+   ord.out <- order(out$mu[,1])
+   ord.in <- order(component.means[,1])
+ 
+   means.out <- out$mu[ord.out,]
+   means.in <- component.means[ord.in,]
+ 
+   # Cluster stds and variances
+   sds.out <- out$sd[ord.out,]
+   vars.out <- sds.out^2
+ 
+   sds.in  <- component.sds[ord.in,]
+   vars.in <- sds.in^2
+ 
+   # Check correspondence between input and output
+   if (length(means.in) == length(means.out)) {
+     cm <- cor(as.vector(means.in), as.vector(means.out))
+     csd <- cor(as.vector(sds.in), as.vector(sds.out))
+   }
+ 
+   # Plot results (assuming 2D)
+   ran <- range(c(as.vector(means.in - 2*vars.in), 
+                as.vector(means.in + 2*vars.in), 
+ 	       as.vector(means.out + 2*vars.out), 
+ 	       as.vector(means.out - 2*vars.out)))
+ 
+   real.modes <- sample2comp
+   obs.modes <- apply(out$qofz, 1, which.max)
+ 
+   # plot(D, pch = 20, main = paste(mm, "/ cor.means:", round(cm,6), "/ Cor.sds:", round(csd,6)), xlim = ran, ylim = ran) 
+   plot(D, pch = real.modes, col = obs.modes, main = paste(mm, "/ cor.means:", round(cm,6), "/ Cor.sds:", round(csd,6)), xlim = ran, ylim = ran) 
+   for (ci in 1:nrow(means.out))  { add.ellipse(centroid = means.out[ci,], covmat = diag(vars.out[ci,]), col = "red") }
+   for (ci in 1:nrow(means.in))  { add.ellipse(centroid = means.in[ci,], covmat = diag(vars.in[ci,]), col = "blue") }
+ 
+ }
> 
> 
> proc.time()
   user  system elapsed 
  4.363   0.282   4.962 
netresponse.Rcheck/tests/mixture.model.test.singlemode.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> 
> skip <- FALSE
> 
> if (!skip) {
+ 
+ library(netresponse)
+ 
+ # SINGLE MODE
+ 
+ # Produce test data that has full covariance
+ # It is expected that
+ # pca.basis = FALSE splits Gaussian with full covariance into two modes
+ # pca.basis = TRUE should detect just a single mode
+ 
+ Ns <- 200
+ Nd <- 2
+ k <- 1.5
+ 
+ D2 <- matrix(rnorm(Ns*Nd), ncol = Nd) %*% rbind(c(1,k), c(k,1))
+ 
+ par(mfrow = c(2,2))
+ for (mm in c("vdp", "bic")) {
+   for (pp in c(FALSE, TRUE)) {
+ 
+     # Fit nonparametric Gaussian mixture model
+     out <- mixture.model(D2, mixture.method = mm, pca.basis = pp)
+     plot(D2, col = apply(out$qofz, 1, which.max), main = paste("mm:" , mm, "/ pp:",  pp)) 
+ 
+   }
+ }
+ 
+ }
Loading required package: Rgraphviz
Loading required package: graph
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
    clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
    IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
    Filter, Find, Map, Position, Reduce, anyDuplicated, append,
    as.data.frame, basename, cbind, colMeans, colSums, colnames,
    dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
    intersect, is.unsorted, lapply, lengths, mapply, match, mget,
    order, paste, pmax, pmax.int, pmin, pmin.int, rank, rbind,
    rowMeans, rowSums, rownames, sapply, setdiff, sort, table, tapply,
    union, unique, unsplit, which, which.max, which.min
Loading required package: grid
Loading required package: minet
Loading required package: mclust
Package 'mclust' version 5.4.3
Type 'citation("mclust")' for citing this R package in publications.
Loading required package: reshape2
netresponse (C) 2008-2016 Leo Lahti et al.
https://github.com/antagomir/netresponse
> 
> proc.time()
   user  system elapsed 
  4.427   0.276   4.838 
netresponse.Rcheck/tests/timing.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> 
> # Play with different options and check their effect on  running times for bic and vdp 
> 
> skip <- TRUE
> 
> if (!skip) {
+ 
+   Ns <- 100
+   Nd <- 2
+ 
+   set.seed(3488400)
+ 
+   D <- cbind(
+ 
+      	rbind(matrix(rnorm(Ns*Nd, mean = 0), ncol = Nd), 
+        	      matrix(rnorm(Ns*Nd, mean = 2), ncol = Nd),
+       	      cbind(rnorm(Ns, mean = -1), rnorm(Ns, mean = 3))
+  	    ), 
+ 
+      	rbind(matrix(rnorm(Ns*Nd, mean = 0), ncol = Nd), 
+        	      matrix(rnorm(Ns*Nd, mean = 2), ncol = Nd),
+       	      cbind(rnorm(Ns, mean = -1), rnorm(Ns, mean = 3))
+  	    )
+ 	    )
+ 
+   rownames(D) <- paste("R", 1:nrow(D), sep = "-")
+   colnames(D) <- paste("C", 1:ncol(D), sep = "-")
+ 
+   ts <- c()
+   for (mm in c("bic", "vdp")) {
+ 
+ 
+     # NOTE: no PCA basis needed with mixture.method = "bic"
+     tt <- system.time(detect.responses(D, verbose = TRUE, max.responses = 5, 
+ 	   		       mixture.method = mm, information.criterion = "BIC", 
+ 			       merging.threshold = 0, bic.threshold = 0, pca.basis = TRUE))
+ 
+     print(paste(mm, ":", round(tt[["elapsed"]], 3)))
+     ts[[mm]] <- tt[["elapsed"]]
+   }
+ 
+    print(paste(names(ts)[[1]], "/", names(ts)[[2]], ": ", round(ts[[1]]/ts[[2]], 3)))
+ 
+ }
> 
> # -> VDP is much faster when sample sizes increase 
> # 1000 samples -> 25-fold speedup with VDP
> 
> 
> 
> proc.time()
   user  system elapsed 
  0.223   0.055   0.249 
netresponse.Rcheck/tests/toydata2.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> # Generate Nc components from normal-inverseGamma prior
> 
> set.seed(12346)
> 
> Ns <- 300
> Nd <- 2
> 
> # Isotropic cloud
> D1 <- matrix(rnorm(Ns*Nd), ncol = Nd) 
> 
> # Single diagonal mode
> D2 <- matrix(rnorm(Ns*Nd), ncol = Nd) %*% rbind(c(1,2), c(2,1)) 
> 
> # Two isotropic modes
> D3 <- rbind(matrix(rnorm(Ns/2*Nd), ncol = Nd), matrix(rnorm(Ns/2*Nd, mean = 3), ncol = Nd))
> D <- cbind(D1, D2, D3)
> 
> colnames(D) <- paste("Feature-",  1:ncol(D), sep = "")
> rownames(D) <- paste("Sample-", 1:nrow(D), sep = "")
> 
> 
> proc.time()
   user  system elapsed 
  0.291   0.064   0.346 
netresponse.Rcheck/tests/validate.netresponse.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> 
> skip <- FALSE
> 
> if (!skip) {
+ 
+ # 2. netresponse test
+ # test later with varying parameters
+ 
+ # Load the package
+ library(netresponse)
+ #load("../data/toydata.rda")
+ fs <- list.files("../R/", full.names = TRUE); for (f in fs) {source(f)};
+ 
+ data(toydata)
+ 
+ D <- toydata$emat
+ netw <- toydata$netw
+ 
+ # The toy data is random data with 10 features (genes). 
+ # The features 
+ rf <- c(4, 5, 6)
+ #form a subnetwork with coherent responses
+ # with means 
+ r1 <- c(0, 3, 0)
+ r2 <- c(-5, 0, 2)
+ r3 <- c(5, -3, -3)
+ mu.real <- rbind(r1, r2, r3)
+ # real weights
+ w.real <- c(70, 70, 60)/200
+ # and unit variances
+ rv <- 1
+ 
+ # Fit the model
+ #res <- detect.responses(D, netw, verbose = TRUE, mc.cores = 2)
+ #res <- detect.responses(D, netw, verbose = TRUE, max.responses = 4)
+ 
+ res <- detect.responses(D, netw, verbose = TRUE, max.responses = 3, mixture.method = "bic", information.criterion = "BIC", merging.threshold = 1, bic.threshold = 10, pca.basis = FALSE)
+ 
+ print("OK")
+ 
+ # Subnets (each is a list of nodes)
+ subnets <- get.subnets(res)
+ 
+ # the correct subnet is retrieved in subnet number 2:
+ #> subnet[[2]]
+ #[1] "feat4" "feat5" "feat6"
+ 
+ # how about responses
+ # Retrieve model for the subnetwork with lowest cost function value
+ # means, standard devations and weights for the components
+ if (!is.null(subnets)) {
+ m <- get.model.parameters(res, subnet.id = "Subnet-2")
+ 
+ # order retrieved and real response means by the first feature 
+ # (to ensure responses are listed in the same order)
+ # and compare deviation from correct solution
+ ord.obs <- order(m$mu[,1])
+ ord.real <- order(mu.real[,1])
+ 
+ print(paste("Correlation between real and observed responses:", cor(as.vector(m$mu[ord.obs,]), as.vector(mu.real[ord.real,]))))
+ 
+ # all real variances are 1, compare to observed ones
+ print(paste("Maximum deviation from real variances: ", max(abs(rv - range(m$sd))/rv)))
+ 
+ # weights deviate somewhat, this is likely due to relatively small sample size
+ #print("Maximum deviation from real weights: ")
+ #print( (w.real[ord.real] - m$w[ord.obs])/w.real[ord.real])
+ 
+ print("estimated and real mean matrices")
+ print(m$mu[ord.obs,])
+ print(mu.real[ord.real,])
+ 
+ }
+ 
+ }
Loading required package: Rgraphviz
Loading required package: graph
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
    clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
    IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
    Filter, Find, Map, Position, Reduce, anyDuplicated, append,
    as.data.frame, basename, cbind, colMeans, colSums, colnames,
    dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
    intersect, is.unsorted, lapply, lengths, mapply, match, mget,
    order, paste, pmax, pmax.int, pmin, pmin.int, rank, rbind,
    rowMeans, rowSums, rownames, sapply, setdiff, sort, table, tapply,
    union, unique, unsplit, which, which.max, which.min
Loading required package: grid
Loading required package: minet
Loading required package: mclust
Package 'mclust' version 5.4.3
Type 'citation("mclust")' for citing this R package in publications.
Loading required package: reshape2
netresponse (C) 2008-2016 Leo Lahti et al.
https://github.com/antagomir/netresponse
convert the network into edge matrix
removing self-links
matching the features between network and datamatrix
Filter the network to only keep the edges with highest mutual information
1 / 8
2 / 8
3 / 8
4 / 8
5 / 8
6 / 8
7 / 8
8 / 8
Compute cost for each variable
Computing model for node 1 / 10
Computing model for node 2 / 10
Computing model for node 3 / 10
Computing model for node 4 / 10
Computing model for node 5 / 10
Computing model for node 6 / 10
Computing model for node 7 / 10
Computing model for node 8 / 10
Computing model for node 9 / 10
Computing model for node 10 / 10
independent models done
Computing delta values for edge  1 / 29 
Computing delta values for edge  2 / 29 
Computing delta values for edge  3 / 29 
Computing delta values for edge  4 / 29 
Computing delta values for edge  5 / 29 
Computing delta values for edge  6 / 29 
Computing delta values for edge  7 / 29 
Computing delta values for edge  8 / 29 
Computing delta values for edge  9 / 29 
Computing delta values for edge  10 / 29 
Computing delta values for edge  11 / 29 
Computing delta values for edge  12 / 29 
Computing delta values for edge  13 / 29 
Computing delta values for edge  14 / 29 
Computing delta values for edge  15 / 29 
Computing delta values for edge  16 / 29 
Computing delta values for edge  17 / 29 
Computing delta values for edge  18 / 29 
Computing delta values for edge  19 / 29 
Computing delta values for edge  20 / 29 
Computing delta values for edge  21 / 29 
Computing delta values for edge  22 / 29 
Computing delta values for edge  23 / 29 
Computing delta values for edge  24 / 29 
Computing delta values for edge  25 / 29 
Computing delta values for edge  26 / 29 
Computing delta values for edge  27 / 29 
Computing delta values for edge  28 / 29 
Computing delta values for edge  29 / 29 
Combining groups,  10  group(s) left...
Combining groups,  9  group(s) left...
Combining groups,  8  group(s) left...
Combining groups,  7  group(s) left...
Combining groups,  6  group(s) left...
Combining groups,  5  group(s) left...
Combining groups,  4  group(s) left...
[1] "OK"
[1] "Correlation between real and observed responses: 0.999117848017521"
[1] "Maximum deviation from real variances:  0.0391530538149302"
[1] "estimated and real mean matrices"
           [,1]       [,2]       [,3]
[1,] -4.9334982 -0.1575946  2.1613225
[2,] -0.1299285  3.0047767 -0.1841669
[3,]  5.0738471 -2.9334877 -3.2217492
   [,1] [,2] [,3]
r2   -5    0    2
r1    0    3    0
r3    5   -3   -3
> 
> proc.time()
   user  system elapsed 
 42.886   0.440  43.680 
netresponse.Rcheck/tests/validate.pca.basis.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> 
> skip <- FALSE
> 
> if (!skip) {
+ # Visualization
+ 
+ library(netresponse)
+ 
+ #fs <- list.files("˜/Rpackages/netresponse/netresponse/R/", full.names = T); for (f in fs) {source(f)}
+ 
+ source("toydata2.R")
+ 
+ # --------------------------------------------------------------------
+ 
+ set.seed(4243)
+ mixture.method <- "bic"
+ 
+ # --------------------------------------------------------------------
+ 
+ res <- detect.responses(D, verbose = TRUE, max.responses = 10, 
+ 	   		       mixture.method = mixture.method, information.criterion = "BIC", 
+ 			       merging.threshold = 1, bic.threshold = 10, pca.basis = FALSE)
+ 
+ res.pca <- detect.responses(D, verbose = TRUE, max.responses = 10, mixture.method = mixture.method, information.criterion = "BIC", merging.threshold = 1, bic.threshold = 10, pca.basis = TRUE)
+ 
+ # --------------------------------------------------------------------
+ 
+ k <- 1
+ 
+ # Incorrect VDP: two modes detected
+ # Correct BIC: single mode detected
+ subnet.id <- names(get.subnets(res))[[k]]
+ 
+ # Correct: single mode detected (VDP & BIC)
+ subnet.id.pca <- names(get.subnets(res.pca))[[k]]
+ 
+ # --------------------------------------------------------------------------------------------------
+ 
+ vis1 <- plot_responses(res, subnet.id, plot_mode = "pca", main = paste("NoPCA; NoDM"))
+ vis2 <- plot_responses(res, subnet.id, plot_mode = "pca", datamatrix = D, main = "NoPCA, DM")
+ vis3 <- plot_responses(res.pca, subnet.id.pca, plot_mode = "pca", main = "PCA, NoDM")
+ vis4 <- plot_responses(res.pca, subnet.id.pca, plot_mode = "pca", datamatrix = D, main = "PCA, DM")
+ 
+ # With original data: VDP overlearns; BIC works; with full covariance data 
+ # With PCA basis: modes detected ok with both VDP and BIC.
+ 
+ # ------------------------------------------------------------------------
+ 
+ # TODO
+ # pca.plot(res, subnet.id)
+ # plot_subnet(res, subnet.id) 
+ }
Loading required package: Rgraphviz
Loading required package: graph
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
    clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
    IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
    Filter, Find, Map, Position, Reduce, anyDuplicated, append,
    as.data.frame, basename, cbind, colMeans, colSums, colnames,
    dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
    intersect, is.unsorted, lapply, lengths, mapply, match, mget,
    order, paste, pmax, pmax.int, pmin, pmin.int, rank, rbind,
    rowMeans, rowSums, rownames, sapply, setdiff, sort, table, tapply,
    union, unique, unsplit, which, which.max, which.min
Loading required package: grid
Loading required package: minet
Loading required package: mclust
Package 'mclust' version 5.4.3
Type 'citation("mclust")' for citing this R package in publications.
Loading required package: reshape2
netresponse (C) 2008-2016 Leo Lahti et al.
https://github.com/antagomir/netresponse
convert the network into edge matrix
removing self-links
matching the features between network and datamatrix
Filter the network to only keep the edges with highest mutual information
1 / 5
2 / 5
3 / 5
4 / 5
5 / 5
Compute cost for each variable
Computing model for node 1 / 6
Computing model for node 2 / 6
Computing model for node 3 / 6
Computing model for node 4 / 6
Computing model for node 5 / 6
Computing model for node 6 / 6
independent models done
Computing delta values for edge  1 / 15 
Computing delta values for edge  2 / 15 
Computing delta values for edge  3 / 15 
Computing delta values for edge  4 / 15 
Computing delta values for edge  5 / 15 
Computing delta values for edge  6 / 15 
Computing delta values for edge  7 / 15 
Computing delta values for edge  8 / 15 
Computing delta values for edge  9 / 15 
Computing delta values for edge  10 / 15 
Computing delta values for edge  11 / 15 
Computing delta values for edge  12 / 15 
Computing delta values for edge  13 / 15 
Computing delta values for edge  14 / 15 
Computing delta values for edge  15 / 15 
Combining groups,  6  group(s) left...
Combining groups,  5  group(s) left...
Combining groups,  4  group(s) left...
Combining groups,  3  group(s) left...
convert the network into edge matrix
removing self-links
matching the features between network and datamatrix
Filter the network to only keep the edges with highest mutual information
1 / 5
2 / 5
3 / 5
4 / 5
5 / 5
Compute cost for each variable
Computing model for node 1 / 6
Computing model for node 2 / 6
Computing model for node 3 / 6
Computing model for node 4 / 6
Computing model for node 5 / 6
Computing model for node 6 / 6
independent models done
Computing delta values for edge  1 / 15 
Computing delta values for edge  2 / 15 
Computing delta values for edge  3 / 15 
Computing delta values for edge  4 / 15 
Computing delta values for edge  5 / 15 
Computing delta values for edge  6 / 15 
Computing delta values for edge  7 / 15 
Computing delta values for edge  8 / 15 
Computing delta values for edge  9 / 15 
Computing delta values for edge  10 / 15 
Computing delta values for edge  11 / 15 
Computing delta values for edge  12 / 15 
Computing delta values for edge  13 / 15 
Computing delta values for edge  14 / 15 
Computing delta values for edge  15 / 15 
Combining groups,  6  group(s) left...
Combining groups,  5  group(s) left...
Combining groups,  4  group(s) left...
Combining groups,  3  group(s) left...
Warning messages:
1: In check.network(network, datamatrix, verbose = verbose) :
  No network provided in function call: assuming fully connected nodes.
2: In check.network(network, datamatrix, verbose = verbose) :
  No network provided in function call: assuming fully connected nodes.
> 
> proc.time()
   user  system elapsed 
 25.432   0.347  25.953 
netresponse.Rcheck/tests/vdpmixture.Rout
R version 3.5.3 (2019-03-11) -- "Great Truth"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> 
> # 1. vdp.mixt: moodien loytyminen eri dimensiolla, naytemaarilla ja komponenteilla
> #   -> ainakin nopea check
> 
> #######################################################################
> 
> # Generate random data from five Gaussians. 
> # Detect modes with vdp-gm. 
> # Plot data points and detected clusters with variance ellipses
> 
> #######################################################################
> 
> library(netresponse)
Loading required package: Rgraphviz
Loading required package: graph
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
    clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
    IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
    Filter, Find, Map, Position, Reduce, anyDuplicated, append,
    as.data.frame, basename, cbind, colMeans, colSums, colnames,
    dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
    intersect, is.unsorted, lapply, lengths, mapply, match, mget,
    order, paste, pmax, pmax.int, pmin, pmin.int, rank, rbind,
    rowMeans, rowSums, rownames, sapply, setdiff, sort, table, tapply,
    union, unique, unsplit, which, which.max, which.min
Loading required package: grid
Loading required package: minet
Loading required package: mclust
Package 'mclust' version 5.4.3
Type 'citation("mclust")' for citing this R package in publications.
Loading required package: reshape2
netresponse (C) 2008-2016 Leo Lahti et al.
https://github.com/antagomir/netresponse
> #source("˜/Rpackages/netresponse/netresponse/R/detect.responses.R")
> #source("˜/Rpackages/netresponse/netresponse/R/internals.R")
> #source("˜/Rpackages/netresponse/netresponse/R/vdp.mixt.R")
> #dyn.load("/home/tuli/Rpackages/netresponse/netresponse/src/netresponse.so")
> 
> 
> #########  Generate DATA #############################################
> 
> res <- generate.toydata()
> D <- res$data
> component.means <- res$means
> component.sds   <- res$sds
> sample2comp     <- res$sample2comp
> 
> ######################################################################
> 
> # Fit nonparametric Gaussian mixture model
> out <- vdp.mixt(D)
> # out <- vdp.mixt(D, c.max = 3) # try with limited number of components -> OK
> 
> ############################################################
> 
> # Compare input data and results
> 
> ord.out <- order(out$posterior$centroids[,1])
> ord.in <- order(component.means[,1])
> 
> means.out <- out$posterior$centroids[ord.out,]
> means.in <- component.means[ord.in,]
> 
> # Cluster stds and variances
> sds.out <- out$posterior$sds[ord.out,]
> sds.in  <- component.sds[ord.in,]
> vars.out <- sds.out^2
> vars.in <- sds.in^2
> 
> # Check correspondence between input and output
> if (length(means.in) == length(means.out)) {
+    cm <- cor(as.vector(means.in), as.vector(means.out))
+    csd <- cor(as.vector(sds.in), as.vector(sds.out))
+ }
> 
> # Plot results (assuming 2D)
> 
> ran <- range(c(as.vector(means.in - 2*vars.in), 
+                as.vector(means.in + 2*vars.in), 
+ 	       as.vector(means.out + 2*vars.out), 
+ 	       as.vector(means.out - 2*vars.out)))
> 
> plot(D, pch = 20, main = paste("Cor.means:", round(cm,3), "/ Cor.sds:", round(csd,3)), xlim = ran, ylim = ran) 
> for (ci in 1:nrow(means.out))  { add.ellipse(centroid = means.out[ci,], covmat = diag(vars.out[ci,]), col = "red") }
> for (ci in 1:nrow(means.in))  { add.ellipse(centroid = means.in[ci,], covmat = diag(vars.in[ci,]), col = "blue") }
> 
> 
> 
> proc.time()
   user  system elapsed 
  3.215   0.226   3.445 
netresponse.Rcheck/netresponse-Ex.timings
| name | user | system | elapsed | |
| ICMg.combined.sampler | 38.109 | 0.091 | 38.896 | |
| ICMg.links.sampler | 2.213 | 0.016 | 2.417 | |
| NetResponseModel-class | 0.001 | 0.001 | 0.001 | |
| PlotMixture | 0 | 0 | 0 | |
| PlotMixtureBivariate | 0.001 | 0.000 | 0.000 | |
| PlotMixtureMultivariate | 0 | 0 | 0 | |
| PlotMixtureMultivariate.deprecated | 0.000 | 0.000 | 0.001 | |
| PlotMixtureUnivariate | 0 | 0 | 0 | |
| add.ellipse | 0.000 | 0.000 | 0.001 | |
| centerData | 0.001 | 0.000 | 0.000 | |
| check.matrix | 0.000 | 0.001 | 0.000 | |
| check.network | 0 | 0 | 0 | |
| detect.responses | 0.003 | 0.002 | 0.005 | |
| dna | 0.030 | 0.005 | 0.037 | |
| enrichment.list.factor | 0.000 | 0.001 | 0.000 | |
| enrichment.list.factor.minimal | 0.000 | 0.000 | 0.001 | |
| filter.netw | 0.001 | 0.000 | 0.000 | |
| filter.network | 0.000 | 0.001 | 0.001 | |
| find.similar.features | 0.505 | 0.055 | 0.579 | |
| generate.toydata | 0.000 | 0.000 | 0.001 | |
| get.dat-NetResponseModel-method | 0.001 | 0.000 | 0.000 | |
| get.mis | 0.001 | 0.000 | 0.001 | |
| get.model.parameters | 0.006 | 0.004 | 0.009 | |
| get.subnets-NetResponseModel-method | 0 | 0 | 0 | |
| getqofz-NetResponseModel-method | 0.000 | 0.000 | 0.001 | |
| independent.models | 0 | 0 | 0 | |
| list.significant.responses | 0.001 | 0.000 | 0.001 | |
| listify.groupings | 0.000 | 0.001 | 0.000 | |
| model.stats | 0.004 | 0.002 | 0.006 | |
| netresponse-package | 4.577 | 0.113 | 4.797 | |
| order.responses | 0 | 0 | 0 | |
| osmo | 0.046 | 0.003 | 0.049 | |
| pick.model.pairs | 0.000 | 0.001 | 0.000 | |
| pick.model.parameters | 0 | 0 | 0 | |
| plotPCA | 0 | 0 | 0 | |
| plot_associations | 0.000 | 0.001 | 0.001 | |
| plot_data | 0.001 | 0.000 | 0.000 | |
| plot_expression | 0.001 | 0.000 | 0.000 | |
| plot_matrix | 0.010 | 0.002 | 0.012 | |
| plot_response | 0.000 | 0.000 | 0.001 | |
| plot_responses | 0 | 0 | 0 | |
| plot_scale | 0 | 0 | 0 | |
| plot_subnet | 0.001 | 0.000 | 0.000 | |
| read.sif | 0 | 0 | 0 | |
| remove.negative.edges | 0.000 | 0.000 | 0.001 | |
| response.enrichment | 0 | 0 | 0 | |
| response2sample | 0.007 | 0.003 | 0.010 | |
| sample2response | 0.000 | 0.001 | 0.000 | |
| set.breaks | 0.000 | 0.000 | 0.001 | |
| toydata | 0.003 | 0.002 | 0.004 | |
| update.model.pair | 0 | 0 | 0 | |
| vdp.mixt | 0.045 | 0.001 | 0.047 | |
| vectorize.groupings | 0 | 0 | 0 | |
| write.netresponse.results | 0.001 | 0.000 | 0.000 | |