This network shows the interconnections between pages in the http://researchdata.ox.ac.uk/ website:
rdo_old_tidygraph %>%
as.igraph() %>%
visIgraph(idToLabel = FALSE) %>%
visOptions(highlightNearest = TRUE) %>%
visEdges(color = "lightgrey") %>%
visNodes(label = NULL) %>%
visLegend()
That’s an unwiedly hairball because of the inclusion of the navbar and footer links, as every single page links to these. To try and reduce this complexity, in the graph below all links from other pages to navbar or footer pages have been removed. Note that some actual data has been lost, as the links from http://researchdata.ox.ac.uk/funder-requirements/bbsrc/ to http://researchdata.ox.ac.uk/funder-requirements have been removed.
navbar_page_new_ids <- rdo_old_index %>%
filter(navbar.page == TRUE) %>%
select(new.id) %>%
.[[1]]
footer_page_new_ids <- rdo_old_index %>%
filter(footer.page == TRUE) %>%
select(new.id) %>%
.[[1]]
rdo_old_tidygraph %>%
activate(edges) %>%
filter(!to %in% navbar_page_new_ids) %>%
filter(!to %in% footer_page_new_ids) %>%
as.igraph() %>%
visIgraph(idToLabel = FALSE) %>%
visOptions(highlightNearest = TRUE) %>%
visLegend()
Extracting out the largest connected component might be useful for you:
rdo_old_tidygraph %>%
activate(edges) %>%
filter(!to %in% navbar_page_new_ids) %>%
filter(!to %in% footer_page_new_ids) %>%
activate(nodes) %>%
mutate(component = group_components()) %>%
filter(component == 1) %>%
as.igraph() %>%
visIgraph(idToLabel = FALSE) %>%
visOptions(highlightNearest = TRUE) %>%
visLegend()