Nothing
## ----setup--------------------------------------------------------------------
library(ideanet)
## ----flor_data, eval = FALSE--------------------------------------------------
# head(florentine_nodes)
# head(florentine_edges)
## ----flor_node_kable, echo=FALSE----------------------------------------------
knitr::kable(head(florentine_nodes))
## ----flor_edge_kable, echo=FALSE----------------------------------------------
knitr::kable(head(florentine_edges))
## ----warning = FALSE, message = FALSE-----------------------------------------
nw_flor <- netwrite(nodelist = florentine_nodes,
node_id = "id",
i_elements = florentine_edges$source,
j_elements = florentine_edges$target,
type = florentine_edges$type,
directed = FALSE,
net_name = "florentine")
## ----flor_cluster, warning = FALSE--------------------------------------------
flor_cluster <- role_analysis(method = "cluster",
graph = nw_flor$igraph_list,
nodes = nw_flor$node_measures,
directed = FALSE,
min_partitions = 2,
max_partitions = 7,
viz = TRUE,
cluster_summaries = TRUE,
fast_triad = TRUE)
## ----cluster_assignments, eval = FALSE----------------------------------------
# head(flor_cluster$cluster_assignments)
## ----cluster_assignments_kable, echo = FALSE----------------------------------
knitr::kable(head(flor_cluster$cluster_assignments))
## ----dendrogram---------------------------------------------------------------
flor_cluster$cluster_dendrogram
## ----cluster_modularity, fig.height = 6, fig.width = 7------------------------
flor_cluster$cluster_modularity
## ----cluster_summaries, eval = FALSE------------------------------------------
# flor_cluster$cluster_summaries
## ----cluster_summaries_kable, echo = FALSE------------------------------------
knitr::kable(flor_cluster$cluster_summaries)
## ----cent_marriage, warning = FALSE, fig.height = 6, fig.width = 7------------
flor_cluster$cluster_summaries_cent$marriage
## ----cent_business, warning = FALSE, fig.height = 6, fig.width = 7------------
flor_cluster$cluster_summaries_cent$business
## ----cent_summary, warning = FALSE, fig.height = 6, fig.width = 7-------------
flor_cluster$cluster_summaries_cent$summary_graph
## ----triad_marriage, warning = FALSE, fig.height = 6, fig.width = 7-----------
flor_cluster$cluster_summaries_triad$marriage
## ----triad_business, warning = FALSE, fig.height = 6, fig.width = 7-----------
flor_cluster$cluster_summaries_triad$business
## ----triad_summary, warning = FALSE, fig.height = 6, fig.width = 7------------
flor_cluster$cluster_summaries_triad$summary_graph
## ----igraph_viz, fig.height = 6, fig.width = 7--------------------------------
igraph::V(nw_flor$florentine)$role <- flor_cluster$cluster_assignments$best_fit
plot(nw_flor$florentine,
vertex.color = as.factor(igraph::V(nw_flor$florentine)$role),
vertex.label = igraph::V(nw_flor$florentine)$family)
## ----fig.height = 6, fig.width = 7--------------------------------------------
flor_cluster$cluster_relations_heatmaps$chisq # Chi-squared
flor_cluster$cluster_relations_heatmaps$density # Density
flor_cluster$cluster_relations_heatmaps$density_std # Density (Standardized)
flor_cluster$cluster_relations_heatmaps$density_centered # Density (Zero-floored)
## ----warning = FALSE, fig.show = "hide", message = FALSE----------------------
flor_concor <- role_analysis(method = "concor",
graph = nw_flor$igraph_list,
nodes = nw_flor$node_measures,
directed = FALSE,
min_partitions = 1,
max_partitions = 4,
viz = TRUE)
## ----block_assignments, eval = FALSE------------------------------------------
# flor_concor$concor_assignments %>%
# dplyr::select(id, family, dplyr::starts_with("block"), best_fit)
## ----block_assignments_kable, echo = FALSE------------------------------------
knitr::kable(flor_concor$concor_assignments %>%
dplyr::select(id, family, dplyr::starts_with("block"), best_fit))
## ----concor_modularity, fig.height = 6, fig.width = 7-------------------------
flor_concor$concor_modularity
## ----concor_sociogram, fig.height = 6, fig.width = 7--------------------------
igraph::V(nw_flor$florentine)$concor <- flor_concor$concor_assignments$best_fit
plot(nw_flor$florentine,
vertex.color = as.factor(igraph::V(nw_flor$florentine)$concor),
vertex.label = NA)
## ----concor_tree, fig.height = 6, fig.width = 7-------------------------------
flor_concor$concor_block_tree
## ----concor_heatmaps, fig.height = 6, fig.width = 7---------------------------
flor_concor$concor_relations_heatmaps$chisq
flor_concor$concor_relations_heatmaps$density
flor_concor$concor_relations_heatmaps$density_std
flor_concor$concor_relations_heatmaps$density_centered
## ----concor_sociogram2, fig.height = 6, fig.width = 7-------------------------
igraph::V(nw_flor$florentine)$concor2 <- flor_concor$concor_assignments$block_2
plot(nw_flor$florentine,
vertex.color = as.factor(igraph::V(nw_flor$florentine)$concor2),
vertex.label = NA)
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.