Logo Questions Linux Laravel Mysql Ubuntu Git Menu
 

tidygraph and igraph - build graph from dataframe discrepancy

I can build a graph object in igraph from two dataframes without problems. When I try do the same in tidygraph I get errors. Let me demonstrate. First I load my source data (data from a message board):

library(dplyr)
library(tidyr)
library(tidygraph)
library(lubridate)
library(iterpc)
library(igraph)

df <- data.frame(author_id = c(2,4,8,16,4,8,2,256,512,8),
             topic_id = c(101,101,101,101,301,301,501,501,501,501),
             time = as.POSIXct(c("2011-08-16 20:20:11", "2011-08-16 21:10:00", "2011-08-17 06:30:10",
                                 "2011-08-17 10:08:32", "2011-08-20 22:23:01","2011-08-20 23:03:03",
                                 "2011-08-25 17:05:01", "2011-08-25 19:15:10",  "2011-08-25 20:07:11",
                                 "2011-08-25 23:59:59")),
             vendor = as.logical(c("FALSE", "FALSE", "TRUE", "FALSE", "FALSE",
                                   "TRUE", "FALSE", "FALSE", "FALSE", "TRUE"))) 

Next, I create a unique node list (people who post things on a message board):

node <- df %>% distinct(author_id, vendor) %>% rename(id = author_id) %>% mutate(vendor = as.numeric(vendor))

Then, my edge list (people connected via a discussion thread (topic)):

edge <- df %>% 
  group_by(topic_id) %>% 
  do(data.frame(getall(iterpc(table(.$author_id), 2, replace =TRUE)))) %>%
  filter(X1 != X2) %>% rename(from = X1, to = X2) %>% select(to, from, topic_id)

Using igraph I can create this graph object:

test_net <- graph_from_data_frame(d = edge, directed = F, vertices = node)
plot(test_net)

This looks good. Now I try do same with tidygraph:

tidy_net <- tbl_graph(nodes = node, edges = edge, directed = F)
Error in add_vertices(gr, nrow(nodes) - gorder(gr)) : At type_indexededgelist.c:369 : cannot add negative number of vertices, Invalid value

Yikes! However, when I import the igraph object into tidygraph:

tidy_net <- as_tbl_graph(test_net)
plot(tidy_net)

All works! What is going on? Please help.

like image 632
aterhorst Avatar asked May 21 '18 23:05

aterhorst


1 Answers

I think because your nodes id and edges to and from are numeric, it assumes that there should be nodes for every integer between min(node$id) (2) and max(node$id) (512). You can get around that by coercing them to characters. Also, your iterpc command doesn't work properly for me, so I converted it to a tidyr version of expanding your data.

node <- 
  df %>% 
  distinct(author_id, vendor) %>% 
  rename(id = author_id) %>% 
  mutate(vendor = as.numeric(vendor)) %>% 
  mutate(id = as.character(id))

edge <- 
  df %>% 
  group_by(topic_id) %>% 
  expand(topic_id, from = author_id, to = author_id) %>% 
  filter(from < to) %>% 
  select(to, from, topic_id) %>% 
  mutate_at(vars(to, from), as.character)

tidy_net <- tbl_graph(nodes = node, edges = edge, directed = F)
plot(tidy_net)
like image 193
CJ Yetman Avatar answered Nov 09 '22 09:11

CJ Yetman