使用 ggraph 绘制 ipgraph 对象:库更新出错

问题描述

我编写了以下代码,以便在笛卡尔平面中绘制无向图。该图有 6 个节点,节点被指定为一串字母数字。它可以包含数字 1 - 9,a = 10,b= 11,c = 12 和 d = 13。每个节点有 2 个坐标; x 和 y。

例如在布局字符串a19363b433d4中:节点1(a,1);节点 2 (9,3) ... 节点 6(d,4)

我已经编写了自己的函数来将字符串转换为 igraph 对象并使用 ggraph 进行绘制。两年前,这段代码运行良好。当我执行代码时,我应该得到一个如下所示的图表。

enter image description here

我相信库已经更新,现在它似乎不起作用。目前我使用的是 R 4.0.3。

当我执行 ggraph() 时,我收到以下错误消息。

graph_to_tree(graph,mode = direction) 中的错误:Graph 必须是 导演

导致此错误的原因是什么?

library(plyr)
library(igraph)
library(tidyverse)
library(ggraph)
library(tidyr)

#user define function
getEdgeListToy <- function(){
  
  E <- matrix(c(0,1,0),nrow = 6,byrow = T) %>%
    data.frame() %>% 
    rename_all(list(function(x) 1:6)) %>% 
    rownames_to_column(var = "from") %>% 
    gather(to,val,2:5) %>% 
    filter(val == 1) %>%
    select(from,to)
  
  return(E)
  
}


  imageSaveDirectory = getwd()
  
    layoutString = "a19363b433d4"
    #layoutString = gsub(",","",layoutString)
    corrdinatePairs = laply(seq(1,nchar(layoutString),2),function(i) substr(layoutString,i,i+1))
    
    temp <- data.frame(Node = c(1:length(corrdinatePairs)),cPairs = corrdinatePairs)
    vertexList <- separate(data = temp,col = cPairs,into = c("x","y"),sep = 1)
    vertexList$Node <- as.character(vertexList$Node)
    
    for(i in 2:3){
      vertexList[,i] <- revalue(vertexList[,i],c("a"="10"))
      vertexList[,c("b"="11"))
      vertexList[,c("c"="12"))
      vertexList[,c("d"="13"))
      vertexList[,i]<-as.numeric(vertexList[,i])
    }
    
    
    # vertexList$x <- as.integer(vertexList$x)
    # vertexList$y <- as.integer(vertexList$y)
    
    #edge list
    edgeListToy <- getEdgeListToy()
    
    #generate the igraph
    g <- graph_from_data_frame(edgeListToy,vertices = vertexList,directed = F)
    
    graphName = paste0(imageSaveDirectory,"_",layoutString,".png")
    nodeLables <- c(" I "," F ","N1","N2","F1","F2")
    nodeColours <- c("#3333FF","#00CC00","#FFFFFF","#FF3366","#FF3366")
    
    
    png(graphName,width = 500,height = 500)
    
    #plot the ipgraph object g
    gPlot<- ggraph(g) + 
      geom_edge_link(edge_width = 1.3) + 
      geom_node_point(size = 10,color = nodeColours)+
      geom_node_point(size = 10,pch=21,color="black")+
      geom_node_text(aes(label = nodeLables))+
      ggtitle(paste0("Toy Layout "),layoutString) +
      coord_flip() +
      expand_limits(x = 0,y = 0) +
      
      # Using scale_x_reverse and swapping the limits
      scale_x_reverse(expand = c(0,limits = c(14,breaks = c(0:14),minor_breaks = NULL) + 
      # switching y position to "right" (pre-flip)
      scale_y_continuous(expand = c(0,limits = c(0,14),minor_breaks = NULL,position = "right") +
      theme_minimal()
    
      
    print(gPlot)
    
    dev.off()

    

解决方法

暂无找到可以解决该程序问题的有效方法,小编努力寻找整理中!

如果你已经找到好的解决方法,欢迎将解决方案带上本链接一起发送给小编。

小编邮箱:dio#foxmail.com (将#修改为@)