Back to Multiple platform build/check report for BioC 3.7 |
|
This page was generated on 2018-10-17 08:23:14 -0400 (Wed, 17 Oct 2018).
Package 991/1561 | Hostname | OS / Arch | INSTALL | BUILD | CHECK | BUILD BIN | ||||||
netresponse 1.40.0 Leo Lahti
| malbec2 | Linux (Ubuntu 16.04.1 LTS) / x86_64 | OK | OK | [ WARNINGS ] | |||||||
tokay2 | Windows Server 2012 R2 Standard / x64 | OK | OK | WARNINGS | OK | |||||||
merida2 | OS X 10.11.6 El Capitan / x86_64 | OK | OK | WARNINGS | OK |
Package: netresponse |
Version: 1.40.0 |
Command: /home/biocbuild/bbs-3.7-bioc/R/bin/R CMD check --install=check:netresponse.install-out.txt --library=/home/biocbuild/bbs-3.7-bioc/R/library --no-vignettes --timings netresponse_1.40.0.tar.gz |
StartedAt: 2018-10-16 02:21:50 -0400 (Tue, 16 Oct 2018) |
EndedAt: 2018-10-16 02:24:35 -0400 (Tue, 16 Oct 2018) |
EllapsedTime: 164.8 seconds |
RetCode: 0 |
Status: WARNINGS |
CheckDir: netresponse.Rcheck |
Warnings: 1 |
############################################################################## ############################################################################## ### ### Running command: ### ### /home/biocbuild/bbs-3.7-bioc/R/bin/R CMD check --install=check:netresponse.install-out.txt --library=/home/biocbuild/bbs-3.7-bioc/R/library --no-vignettes --timings netresponse_1.40.0.tar.gz ### ############################################################################## ############################################################################## * using log directory ‘/home/biocbuild/bbs-3.7-bioc/meat/netresponse.Rcheck’ * using R version 3.5.1 Patched (2018-07-12 r74967) * using platform: x86_64-pc-linux-gnu (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.40.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 ... NOTE File ‘netresponse/libs/netresponse.so’: Found ‘rand’, possibly from ‘rand’ (C) Object: ‘netresponse.o’ Found ‘srand’, possibly from ‘srand’ (C) Object: ‘netresponse.o’ Compiled code should not call entry points which might terminate R nor write to stdout/stderr instead of to the console, nor use Fortran I/O nor system RNGs. See ‘Writing portable packages’ in the ‘Writing R Extensions’ manual. * 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 28.624 0.016 28.655 * 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, 1 NOTE See ‘/home/biocbuild/bbs-3.7-bioc/meat/netresponse.Rcheck/00check.log’ for details.
netresponse.Rcheck/00install.out
############################################################################## ############################################################################## ### ### Running command: ### ### /home/biocbuild/bbs-3.7-bioc/R/bin/R CMD INSTALL netresponse ### ############################################################################## ############################################################################## * installing to library ‘/home/biocbuild/bbs-3.7-bioc/R/library’ * installing *source* package ‘netresponse’ ... ** libs gcc -I"/home/biocbuild/bbs-3.7-bioc/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -Wall -c netresponse.c -o netresponse.o netresponse.c: In function ‘mHPpost’: netresponse.c:264:15: warning: unused variable ‘prior_fields’ [-Wunused-variable] const char *prior_fields[]={"Mumu","S2mu", ^ netresponse.c: In function ‘mLogLambda’: netresponse.c:713:3: warning: ‘U_p’ may be used uninitialized in this function [-Wmaybe-uninitialized] vdp_mk_log_lambda(Mumu, S2mu, Mubar, Mutilde, ^ netresponse.c:713:3: warning: ‘KsiBeta’ may be used uninitialized in this function [-Wmaybe-uninitialized] netresponse.c:713:3: warning: ‘KsiAlpha’ may be used uninitialized in this function [-Wmaybe-uninitialized] netresponse.c:713:3: warning: ‘BetaKsi’ may be used uninitialized in this function [-Wmaybe-uninitialized] netresponse.c:713:3: warning: ‘AlphaKsi’ may be used uninitialized in this function [-Wmaybe-uninitialized] netresponse.c:713:3: warning: ‘Mutilde’ may be used uninitialized in this function [-Wmaybe-uninitialized] netresponse.c:713:3: warning: ‘Mubar’ may be used uninitialized in this function [-Wmaybe-uninitialized] netresponse.c:713:3: warning: ‘S2mu’ may be used uninitialized in this function [-Wmaybe-uninitialized] netresponse.c:713:3: warning: ‘Mumu’ may be used uninitialized in this function [-Wmaybe-uninitialized] gcc -shared -L/home/biocbuild/bbs-3.7-bioc/R/lib -L/usr/local/lib -o netresponse.so netresponse.o -L/home/biocbuild/bbs-3.7-bioc/R/lib -lR installing to /home/biocbuild/bbs-3.7-bioc/R/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.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.1 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 2.308 0.076 2.379
netresponse.Rcheck/tests/ICMg.test.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.1 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):400394435410432400424448389471460416418442405431481467416400412441458400 m(z):596987637271785768606768817674797067706780807276 I:10 convL:-0.469218064099133n(z):1784372268172543114533923457702110268464211332466228355277192188473218285 convN:-0.00856665274572707m(z):4913055984648645759119179437671551224487454531335798 I:20 convL:-0.406578194256285n(z):19843019711052382264323383766822020293563205242393149359325185195628157314 convN:-0.00634502015203465m(z):48137548946485862531051795182705311345766146403354108 I:30 convL:-0.357992021907387n(z):26549518411692501924272773746661895310650184213422134294335191176681156310 convN:-0.00735829085967704m(z):50139558645475569491071765382715411645775547373356107 I:40 convL:-0.346210178030863n(z):25361218211492371754182973396501930338628204197398130251335212195669157294 convN:-0.00297815094823451m(z):51139558745465669481061775383715411545775646373356106 I:50 convL:-0.354119521039752n(z):25767520211252321683692943476131846351616206188416161266364217196738126277 convN:-0.00203563824063818m(z):56139558445475369481071795383715411345775546373356106 I:60 convL:-0.324456598007128n(z):26970817611672281844142833555421783361660204147437162267345220152757153276 convN:-0.00259774058704298m(z):56137558645465569481061785384715411445775546373355106 I:70 convL:-0.339357877616698n(z):29181520412142261524062893525031667375661220131475157276335208124768139262 convN:-0.00414967487890282m(z):56138558445475669481051775383715411646765745373453106 I:80 convL:-0.324179259351145n(z):27586019811772511613972353705021690360646220133456142285340225133788139267 convN:-0.00147484053765197m(z):55137558645465669481051775384715411646765746373353106 I:90 convL:-0.320006653836566n(z):27389621112202561653542293505121647357627243139453162250328249138793140258 convN:-0.00361406234244554m(z):56137558445475669481061785383715411545765646373354107 I:100 convL:-0.335444653719329n(z):30692320712052151723822503444641612343634247151410141282316239172787152296 convN:-0.000882894248022355m(z):56138558445475569481061775383715411646775546373354106 Sample iterations:100 I:110 convL:-0.322721427561194n(z):26586721412501901734022253414861640340617244149421167298312237162785151314 convN:-0.00389171899510411m(z):55137558645475669481061755383715411546775446373354109 I:120 convL:-0.312088242968694n(z):27593523412292081683892053574731548346576244158449159252326221162834168334 convN:-0.00317282080619169m(z):55137558644475569471061785382715411546765746373354108 I:130 convL:-0.294713529454227n(z):23897425312172061893872093514721496342584251152468136248337220165831196328 convN:-0.00237171025403584m(z):55136558645475569481051765383715411646765746373354108 I:140 convL:-0.316920959625252n(z):26497121312072071823922173465041467329594258182497156232317241155798183338 convN:-0.00353634626559325m(z):55137558545475668471061765383725411646765746373353108 I:150 convL:-0.314673710361289n(z):27399520812421991884082183584781436328541254166495158254311243186806162343 convN:-0.00131628175687387m(z):55138558545475669471061765383715411646765746373353107 I:160 convL:-0.302762279743201n(z):293107522311791661964342313424661448322556244152465152269288260173823160333 convN:-0.00344492909095411m(z):56138558445475669481061745382715411646765646373353110 I:170 convL:-0.315948746655599n(z):260108719811801921983982013524991408333571257150472138281302240180831182340 convN:-0.0013960287342558m(z):55137558645475669471061755382715411646765746373353109 I:180 convL:-0.309062403043298n(z):278108120411961882024301923744561378331549248159532136268291252178804182341 convN:-0.00468689839472609m(z):55137558645475669471051765382715411646765846373353108 I:190 convL:-0.309575221773271n(z):252117619111732191954502013824651324341570233167514148253269218175830163341 convN:-0.00186121019730751m(z):55137558645465669481051775383715411446765746373353109 I:200 convL:-0.323760769222846n(z):280119720111982292154301813534851317351562242174469125284268204179809163334 convN:-0.00140582359986373m(z):56137558445475569481051755383715411646765746373354109 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 6.696 0.124 6.820
netresponse.Rcheck/tests/mixture.model.test.multimodal.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.1 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 4.020 0.124 4.144
netresponse.Rcheck/tests/mixture.model.test.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.1 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 2.296 0.084 2.375
netresponse.Rcheck/tests/mixture.model.test.singlemode.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.1 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 2.480 0.100 2.572
netresponse.Rcheck/tests/timing.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.160 0.008 0.161
netresponse.Rcheck/tests/toydata2.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.152 0.012 0.158
netresponse.Rcheck/tests/validate.netresponse.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.1 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 30.108 0.148 30.273
netresponse.Rcheck/tests/validate.pca.basis.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.1 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 19.524 0.144 19.679
netresponse.Rcheck/tests/vdpmixture.Rout
R version 3.5.1 Patched (2018-07-12 r74967) -- "Feather Spray" Copyright (C) 2018 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (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.1 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 2.352 0.092 2.434
netresponse.Rcheck/netresponse-Ex.timings
name | user | system | elapsed | |
ICMg.combined.sampler | 28.624 | 0.016 | 28.655 | |
ICMg.links.sampler | 1.112 | 0.000 | 1.112 | |
NetResponseModel-class | 0.000 | 0.004 | 0.002 | |
PlotMixture | 0 | 0 | 0 | |
PlotMixtureBivariate | 0.000 | 0.000 | 0.001 | |
PlotMixtureMultivariate | 0.000 | 0.000 | 0.001 | |
PlotMixtureMultivariate.deprecated | 0 | 0 | 0 | |
PlotMixtureUnivariate | 0 | 0 | 0 | |
add.ellipse | 0 | 0 | 0 | |
centerData | 0.000 | 0.000 | 0.001 | |
check.matrix | 0.000 | 0.000 | 0.001 | |
check.network | 0.004 | 0.000 | 0.002 | |
detect.responses | 0.000 | 0.000 | 0.003 | |
dna | 0.02 | 0.00 | 0.02 | |
enrichment.list.factor | 0 | 0 | 0 | |
enrichment.list.factor.minimal | 0 | 0 | 0 | |
filter.netw | 0.004 | 0.000 | 0.000 | |
filter.network | 0.000 | 0.000 | 0.001 | |
find.similar.features | 0.212 | 0.032 | 0.245 | |
generate.toydata | 0 | 0 | 0 | |
get.dat-NetResponseModel-method | 0 | 0 | 0 | |
get.mis | 0.000 | 0.000 | 0.001 | |
get.model.parameters | 0.000 | 0.004 | 0.004 | |
get.subnets-NetResponseModel-method | 0 | 0 | 0 | |
getqofz-NetResponseModel-method | 0.000 | 0.000 | 0.001 | |
independent.models | 0.000 | 0.000 | 0.001 | |
list.significant.responses | 0 | 0 | 0 | |
listify.groupings | 0 | 0 | 0 | |
model.stats | 0.004 | 0.000 | 0.003 | |
netresponse-package | 2.688 | 0.008 | 2.696 | |
order.responses | 0 | 0 | 0 | |
osmo | 0.040 | 0.000 | 0.039 | |
pick.model.pairs | 0 | 0 | 0 | |
pick.model.parameters | 0.004 | 0.000 | 0.000 | |
plotPCA | 0 | 0 | 0 | |
plot_associations | 0 | 0 | 0 | |
plot_data | 0 | 0 | 0 | |
plot_expression | 0 | 0 | 0 | |
plot_matrix | 0.008 | 0.000 | 0.007 | |
plot_response | 0.000 | 0.000 | 0.001 | |
plot_responses | 0.000 | 0.000 | 0.001 | |
plot_scale | 0 | 0 | 0 | |
plot_subnet | 0 | 0 | 0 | |
read.sif | 0 | 0 | 0 | |
remove.negative.edges | 0.004 | 0.000 | 0.001 | |
response.enrichment | 0.000 | 0.000 | 0.001 | |
response2sample | 0.004 | 0.004 | 0.006 | |
sample2response | 0.000 | 0.000 | 0.001 | |
set.breaks | 0 | 0 | 0 | |
toydata | 0.000 | 0.000 | 0.002 | |
update.model.pair | 0.004 | 0.000 | 0.001 | |
vdp.mixt | 0.036 | 0.000 | 0.035 | |
vectorize.groupings | 0 | 0 | 0 | |
write.netresponse.results | 0 | 0 | 0 | |