[BioC] Rgraphviz warnings in R-2.0 : I see Nodes but don't see Edges

Saurin Jani saurin_jani at yahoo.com
Mon Oct 18 23:00:09 CEST 2004


Hi ,

In addition to privious message
I see nodes but I don't see edges conneted to nodes.

Thank you,
Saurin


if(require(Rgraphviz)){
+
+  opar = par(xpd = NA)
+  plotPieChart <- function(curPlot,counts,main) {
+
+  renderNode <- function(x) {
+
+  force(x)
+  y <- x * 100 + 1
+  function(node,ur,attrs = list(),radConv = 1) {
+           nodeCenter <- getNodeCenter(node)
+           pieGlyph(y,xpos = getX(nodeCenter),ypos =
getY(nodeCenter),
+                    radius = getNodeRW(node),col =
c("pink","green"))
+          
#drawTxtLabel(txtLabel(node),getX(nodeCenter),getY(nodeCenter))
+           }
+
+       }
+ drawing <- vector(mode = "list",length =
nrow(counts));
+ for(i in 1:length(drawing)){
+     drawing[[i]] <- renderNode(counts[i,])
+     }
+  if(missing(main))
+   main = "GO: Cellular Component : Mouse Embryo
Fibroblast Pie Chart Plot"
+   plot(curPlot,drawNode = drawing,main = main)
+  legend(300,65,legend = c("KO","WT"), fill =
c("pink","green"))
+  }
+
+ plotPieChart(pgLayoutCC,ctmat)
+ par(opar)
+ }
Error in FUN(X[[1]], ...) : couldn't find function
"convertRadius"

Thank you,

Saurin



More information about the Bioconductor mailing list