networkSimulation {AMOUNTAIN} | R Documentation |
Simulate a single weighted network
networkSimulation(n, k, theta)
n |
number of nodes in the network |
k |
number of nodes in the module, n < k |
theta |
module node score follow the uniform distribution in range [theta,1] |
a list containing network adjacency matrix, node score and module membership
Dong Li, dxl466@cs.bham.ac.uk
pp <- networkSimulation(100,20,0.5) moduleid <- pp[[3]] netid <- 1:100 restp<- netid[-moduleid] groupdesign=list(moduleid,restp) names(groupdesign)=c('module','background') ## Not run: library(qgraph) pg<-qgraph(pp[[1]],groups=groupdesign,legend=TRUE) ## End(Not run)