[BioC] Issue with removeNode?
Jonathan Swinton
jonathan-bioconductor at swintons.net
Thu Jun 1 12:18:07 CEST 2006
An unexpected error when trying to remove nodes from a graphNEL object:
library(graph)
# using the example from the removeNode help page
V <- LETTERS[1:4]
edL2 <- vector("list", length=4)
names(edL2) <- V
for(i in 1:4) edL2[[i]] <- list(edges=c(2,1,2,1)[i],
weights=sqrt(i))
gR2 <- new("graphNEL", nodes=V, edgeL=edL2, edgemode="directed")
gX <- removeNode("C", gR2)
# works fine and then so does
gY <- removeNode(c("A","D"), gX)
# but not
gZ <- removeNode(c("A","C","D"), gR2)
Error in clearNode(node, object) : no such index at level 2
sessionInfo()
Version 2.3.0 (2006-04-24)
i386-pc-mingw32
attached base packages:
[1] "tools" "methods" "stats" "graphics" "grDevices" "utils"
[7] "datasets" "base"
other attached packages:
Rgraphviz graph Ruuid Biobase
"1.10.0" "1.10.4" "1.10.0" "1.10.0"
More information about the Bioconductor
mailing list