library(magrittr)
library(pkggraph)
## Loading required package: ggnetwork
## Loading required package: ggplot2
## Loading required package: data.table
init()
## Fetching package metadata from repositories ...
## Computing package dependencies ...
## Done!
get_all_dependencies(
"RSQLite",
level = 100,
relation = c("Depends", "Imports", "LinkingTo"),
strict = TRUE
) %>%
make_neighborhood_graph() %>%
plot()
## Loading required package: sna
## Loading required package: statnet.common
##
## Attaching package: 'statnet.common'
## The following object is masked from 'package:base':
##
## order
## Loading required package: network
## network: Classes for Relational Data
## Version 1.13.0 created on 2015-08-31.
## copyright (c) 2005, Carter T. Butts, University of California-Irvine
## Mark S. Handcock, University of California -- Los Angeles
## David R. Hunter, Penn State University
## Martina Morris, University of Washington
## Skye Bender-deMoll, University of Washington
## For citation information, type citation("network").
## Type help("network-package") to get started.
## sna: Tools for Social Network Analysis
## Version 2.4 created on 2016-07-23.
## copyright (c) 2005, Carter T. Butts, University of California-Irvine
## For citation information, type citation("sna").
## Type help(package="sna") to get started.
