[BioC] Rgraphviz warnings in R-2.0

Saurin Jani saurin_jani at yahoo.com
Mon Oct 18 22:57:53 CEST 2004


Hi Jeff,

Thank you so much. I asked question because when I do
below code  R-1.9 then with graphviz 1.12 and
Rgraphviz 1.4.0 it was working great. 

But now I have R-2.0 and same graphviz and Rgraphviz I
get error message.


--------------------------------------
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