addSeries {RedeR} | R Documentation |
Method to send series of graphs to RedeR app.
addSeries(obj, g, ...)
obj |
Object of RedPort Class. |
g |
An igraph object. |
... |
Additional arguments passed to RedeR application. |
Additional arguments:
Logical value, whether to update node attributes in the new item of the series (default = TRUE).
Logical value, whether to add edges and update attributes in the new item of the series (default = TRUE).
Submits series of R graphs to RedeR app.
Mauro Castro
# Initialize igraph library(igraph) ## Not run: rdp <- RedPort() calld(rdp) ### g1 <- graph.lattice(c(3,3,3)) addGraph( rdp, g1, layout.kamada.kawai(g1) ) V(g1)$nodeColor<-heat.colors(vcount(g1)) addSeries( rdp, g1) ## End(Not run)