################################################### ### chunk number 1: createGraph1 ################################################### #line 36 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" library("Rgraphviz") set.seed(123) V <- letters[1:10] M <- 1:4 ################################################### ### chunk number 2: createGraph2 ################################################### #line 42 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" g1 <- randomGraph(V, M, 0.2) ################################################### ### chunk number 3: plotDot ################################################### #line 52 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1) ################################################### ### chunk number 4: plotNeato ################################################### #line 62 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1, "neato") ################################################### ### chunk number 5: plotTwopi ################################################### #line 65 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1, "twopi") ################################################### ### chunk number 6: rEG ################################################### #line 86 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" rEG <- new("graphNEL", nodes=c("A", "B"), edgemode="directed") rEG <- addEdge("A", "B", rEG, 1) rEG <- addEdge("B", "A", rEG, 1) ################################################### ### chunk number 7: recipEdgesComb ################################################### #line 100 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(rEG) ################################################### ### chunk number 8: recipEdgesDistinct ################################################### #line 103 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(rEG, recipEdges="distinct") ################################################### ### chunk number 9: removedEdges ################################################### #line 112 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" removedEdges(g1) ################################################### ### chunk number 10: getSubgraphs ################################################### #line 126 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" sg1 <- subGraph(c("a","d","j","i"), g1) sg1 sg2 <- subGraph(c("b","e","h"), g1) sg3 <- subGraph(c("c","f","g"), g1) ################################################### ### chunk number 11: subGplot ################################################### #line 159 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" subGList <- vector(mode="list", length=3) subGList[[1]] <- list(graph=sg1) subGList[[2]] <- list(graph=sg2, cluster=FALSE) subGList[[3]] <- list(graph=sg3) plot(g1, subGList=subGList) ################################################### ### chunk number 12: subGPlot2 ################################################### #line 177 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" sg1 <- subGraph(c("a","c","d","e","j"), g1) sg2 <- subGraph(c("f","h","i"), g1) plot(g1, subGList=list(list(graph=sg1), list(graph=sg2))) ################################################### ### chunk number 13: edgeNames ################################################### #line 196 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" edgeNames(g1) edgeNames(g1, recipEdges="distinct") ################################################### ### chunk number 14: defAttrs ################################################### #line 256 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" defAttrs <- getDefaultAttrs() ################################################### ### chunk number 15: defAttrs2 ################################################### #line 269 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1, attrs=list(node=list(label="foo", fillcolor="lightgreen"), edge=list(color="cyan"), graph=list(rankdir="LR"))) ################################################### ### chunk number 16: baseLists ################################################### #line 296 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" nAttrs <- list() eAttrs <- list() ################################################### ### chunk number 17: makeLabels1 ################################################### #line 308 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" z <- strsplit(packageDescription("Rgraphviz")$Description, " ")[[1]] z <- z[1:numNodes(g1)] names(z) = nodes(g1) nAttrs$label <- z ################################################### ### chunk number 18: makeLabels2 ################################################### #line 314 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" eAttrs$label <- c("a~h"="Label 1", "c~h"="Label 2") ################################################### ### chunk number 19: makeLabels3 ################################################### #line 317 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" attrs <- list(node=list(shape="ellipse", fixedsize=FALSE)) ################################################### ### chunk number 20: figLabels ################################################### #line 320 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1, nodeAttrs=nAttrs, edgeAttrs=eAttrs, attrs=attrs) ################################################### ### chunk number 21: edgeWeights ################################################### #line 347 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" ew <- as.character(unlist(edgeWeights(g1))) ew <- ew[setdiff(seq(along=ew), removedEdges(g1))] names(ew) <- edgeNames(g1) eAttrs$label <- ew ## FIXME (wh 17.6.06): This does not work - see bug report: ## attrs$edge$labelfontsize="27" ################################################### ### chunk number 22: edgeWeightLabels ################################################### #line 355 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1, nodeAttrs=nAttrs, edgeAttrs=eAttrs, attrs=attrs) ################################################### ### chunk number 23: colors ################################################### #line 373 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" ## Specify node drawing color nAttrs$color <- c(a="red", b="red", g="green", d="blue") ## Specify edge drawing color eAttrs$color <- c("a~d"="blue", "c~h"="purple") ## Specify node fill color nAttrs$fillcolor <- c(j="yellow") ## label color nAttrs$fontcolor <- c(e="green", f="red") eAttrs$fontcolor <- c("a~h"="green", "c~h"="brown") nAttrs eAttrs ################################################### ### chunk number 24: figColors ################################################### #line 390 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1, nodeAttrs=nAttrs, attrs=attrs) ################################################### ### chunk number 25: nodeShapes ################################################### #line 413 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" attrs$node$shape <- "ellipse" nAttrs$shape <- c(g="box", f="circle", j="box", a="plaintext") ################################################### ### chunk number 26: figNodeShapes ################################################### #line 417 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1, attrs=attrs, nodeAttrs=nAttrs) ################################################### ### chunk number 27: getLists1 ################################################### #line 447 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" nodes <- buildNodeList(g1) edges <- buildEdgeList(g1) ################################################### ### chunk number 28: getLists2 ################################################### #line 453 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" nodes[[1]] edges[[1]] ################################################### ### chunk number 29: buildwithAttrs ################################################### #line 461 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" nodes <- buildNodeList(g1, nodeAttrs=nAttrs, defAttrs=defAttrs$node) edges <- buildEdgeList(g1, edgeAttrs=eAttrs, defAttrs=defAttrs$edge) nodes[[1]] edges[[1]] ################################################### ### chunk number 30: arrowheads ################################################### #line 471 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" for(j in c("a~e", "a~h")) edges[[j]]@attrs$arrowhead <- "open" ################################################### ### chunk number 31: plotbuild ################################################### #line 482 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" vv <- agopen(name="foo", nodes=nodes, edges=edges, attrs=attrs, edgeMode="undirected") plot(vv) ################################################### ### chunk number 32: graph17 ################################################### #line 496 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" data(graphExamples) z <- graphExamples[[8]] nNodes <- length(nodes(z)) nA <- list() nA$fixedSize<-rep(FALSE, nNodes) nA$height <- nA$width <- rep("1", nNodes) nA$label <- rep("z", nNodes) nA$color <- rep("green", nNodes) nA$fillcolor <- rep("orange", nNodes) nA$shape <- rep("circle", nNodes) nA$fontcolor <- rep("blue", nNodes) nA$fontsize <- rep(14, nNodes) nA <- lapply(nA, function(x) { names(x) <- nodes(z); x}) ################################################### ### chunk number 33: graph17 ################################################### #line 513 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(z, nodeAttrs=nA) ################################################### ### chunk number 34: pieChartCalc ################################################### #line 568 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" set.seed(123) counts = matrix(rexp(numNodes(g1)*4), ncol=4) g1layout <- agopen(g1, name="foo") makeNodeDrawFunction <- function(x) { force(x) function(node, ur, attrs, radConv) { nc <- getNodeCenter(node) pieGlyph(x, xpos=getX(nc), ypos=getY(nc), radius=getNodeRW(node), col=rainbow(4)) text(getX(nc), getY(nc), paste(signif(sum(x), 2)), cex=0.5, col="white", font=2) } } drawFuns <- apply(counts, 1, makeNodeDrawFunction) ################################################### ### chunk number 35: pieChartGraph ################################################### #line 591 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g1layout, drawNode=drawFuns, main="Example Pie Chart Plot") ################################################### ### chunk number 36: clusterGraph1 ################################################### #line 617 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" cG <- new("clusterGraph", clusters=list(a=c(1:10), b=c(11:13), c=c(14:20), d=c(21, 22))) ################################################### ### chunk number 37: cGdot ################################################### #line 627 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(cG, main="dot") ################################################### ### chunk number 38: cGtwopi ################################################### #line 630 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" par(bg="#e0e0e0") plot(cG, "twopi", main="twopi") ################################################### ### chunk number 39: cGneato ################################################### #line 634 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(cG, "neato", main="neato") ################################################### ### chunk number 40: bipartite1 ################################################### #line 678 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" set.seed(123) nodes1 <- paste(0:7) nodes2 <- letters[1:10] ft <- cbind(sample(nodes1, 24, replace=TRUE), sample(nodes2, 24, replace=TRUE)) ft <- ft[!duplicated(apply(ft, 1, paste, collapse="")),] g <- ftM2graphNEL(ft, edgemode='directed') g ################################################### ### chunk number 41: bipartitelayout ################################################### #line 696 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" twocolors <- c("#D9EF8B", "#E0F3F8") nodeType <- 1 + (nodes(g) %in% nodes1) nA = makeNodeAttrs(g, fillcolor=twocolors[nodeType]) sg1 = subGraph(nodes1, g) sgL = list(list(graph=sg1, cluster = FALSE, attrs = c(rank="sink"))) att = list(graph = list(rankdir = "LR", rank = "")) ################################################### ### chunk number 42: figbipartite ################################################### #line 709 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(g, attrs = att, nodeAttrs=nA, subGList = sgL) ################################################### ### chunk number 43: agopenSimpleDemo ################################################### #line 736 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" library("graph") g1_gz <- gzfile(system.file("GXL/graphExample-01.gxl.gz",package="graph"), open="rb") g11_gz <- gzfile(system.file("GXL/graphExample-11.gxl.gz",package="graph"), open="rb") g1 <- fromGXL(g1_gz) g11 <- fromGXL(g11_gz) g1_11 <- join(g1, g11) sgl <- vector(mode="list", length=2) sgl[[1]] <- list(graph=g1, cluster=FALSE) sgl[[2]] <- list(graph=g11, cluster=TRUE) ng <- agopenSimple(g1_11, "tmpsg", subGList=sgl) ################################################### ### chunk number 44: DataDefaultsDemo1 ################################################### #line 769 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" graphDataDefaults(ng) nodeDataDefaults(ng) edgeDataDefaults(ng) ################################################### ### chunk number 45: DataDefaultsDemo2 ################################################### #line 780 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" graphDataDefaults(ng, c("size", "bgcolor")) <- c("1", "yellow") nodeDataDefaults(ng, c("fontcolor", "width")) <- c("blue", 0.5) edgeDataDefaults(ng, c("color", "style")) <- c("green", "dotted") ################################################### ### chunk number 46: DataDemo1 ################################################### #line 799 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" graphData(ng, "bgcolor") nodeData(ng, "a", c("fontcolor", "width")) edgeData(ng, "f", "h", c("color", "arrowhead")) ################################################### ### chunk number 47: DataDemo2 ################################################### #line 822 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" graphData(ng, "bgcolor") <- "orange" clusterData(ng, 2, "bgcolor") <- "red" nodeData(ng, "a", c("fontcolor", "width")) <- c("red", "0.8") edgeData(ng, "f", "h", c("color", "style")) <- c("blue", "solid") ################################################### ### chunk number 48: layoutRenderDemo1 ################################################### #line 848 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" plot(ng, "neato") plot(ng, "circo") ################################################### ### chunk number 49: layoutRenderDemo1 ################################################### #line 858 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" toFile(ng, layoutType="dot", filename="test_dot.svg", fileType="svg") toFile(ng, layoutType="circo", filename="test_circo.ps", fileType="ps") toFile(ng, layoutType="twopi", filename="test_twopi.dot", fileType="dot") ################################################### ### chunk number 50: ################################################### #line 884 "vignettes/Rgraphviz/inst/doc/Rgraphviz.Rnw" sessionInfo()