diff --git a/CONTRIBUTING.md b/CONTRIBUTING.md index f9da786934..05151c5124 100644 --- a/CONTRIBUTING.md +++ b/CONTRIBUTING.md @@ -154,11 +154,7 @@ pak::pak("igraph/igraph.r2cdocs") [roxygen2](https://roxygen2.r-lib.org/), and run `devtools::document()` or `make igraph` to update the `.Rd` files. -- Links to C docs are added using the cdocs tag, for instance: - -``` -#' @cdocs igraph_assortativity -``` +- Links to C docs are added automatically thanks to the igraph.r2cdocs's roclet. ### Maintaining igraph.r2cdocs diff --git a/DESCRIPTION b/DESCRIPTION index c30e3fee44..ef458d2537 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -81,7 +81,7 @@ Config/testthat/start-first: aaa-auto, vs-es, scan, vs-operators, weakref, watts.strogatz.game Encoding: UTF-8 Roxygen: list(markdown = TRUE, roclets = c("collate", "rd", "namespace", - "igraph.r2cdocs::cdocs_roclet", "devtag::dev_roclet"), packages = + "igraph.r2cdocs::docs_rd", "devtag::dev_roclet"), packages = "igraph.r2cdocs") RoxygenNote: 7.3.3.9000 SystemRequirements: libxml2 (optional), glpk (>= 4.57, optional) diff --git a/R/assortativity.R b/R/assortativity.R index 912cd9ae3c..49a2d72934 100644 --- a/R/assortativity.R +++ b/R/assortativity.R @@ -160,7 +160,6 @@ assortativity.degree <- function(graph, directed = TRUE) { #' #' # BA model, tends to be dissortative #' assortativity_degree(sample_pa(10000, m = 4)) -#' @cdocs igraph_assortativity assortativity <- function( graph, values, @@ -240,7 +239,6 @@ assortativity_legacy <- function( #' with [as.integer()]. #' @rdname assortativity #' @export -#' @cdocs igraph_assortativity_nominal assortativity_nominal <- function( graph, types, @@ -257,7 +255,6 @@ assortativity_nominal <- function( #' @rdname assortativity #' @export -#' @cdocs igraph_assortativity_degree assortativity_degree <- function(graph, directed = TRUE) { assortativity_degree_impl( graph = graph, diff --git a/R/bipartite.R b/R/bipartite.R index c5cabb2387..5e64031358 100644 --- a/R/bipartite.R +++ b/R/bipartite.R @@ -226,7 +226,6 @@ bipartite_projection <- function( #' @rdname bipartite_projection #' @export -#' @cdocs igraph_bipartite_projection_size bipartite_projection_size <- function(graph, types = NULL) { bipartite_projection_size_impl( graph = graph, @@ -283,7 +282,6 @@ bipartite_projection_size <- function(graph, types = NULL) { #' bipartite_mapping(g3) #' @family bipartite #' @export -#' @cdocs igraph_is_bipartite bipartite_mapping <- function(graph) { is_bipartite_impl( graph = graph diff --git a/R/centrality.R b/R/centrality.R index a017fa3590..f239487876 100644 --- a/R/centrality.R +++ b/R/centrality.R @@ -1291,7 +1291,6 @@ eigen_defaults <- function() { #' eigen_centrality(g) #' @family centrality #' @export -#' @cdocs igraph_eigenvector_centrality eigen_centrality <- function( graph, directed = FALSE, @@ -1371,7 +1370,6 @@ eigen_centrality <- function( #' strength(g) #' @family centrality #' @export -#' @cdocs igraph_strength strength <- function( graph, vids = V(graph), @@ -1429,7 +1427,6 @@ strength <- function( #' diversity(g3) #' @family centrality #' @export -#' @cdocs igraph_diversity diversity <- function(graph, weights = NULL, vids = V(graph)) { diversity_impl( graph = graph, @@ -1497,7 +1494,6 @@ diversity <- function(graph, weights = NULL, vids = V(graph)) { #' g2 <- make_ring(10) #' hits_scores(g2) #' @family centrality -#' @cdocs igraph_hub_and_authority_scores hits_scores <- function( graph, ..., @@ -1681,7 +1677,6 @@ hub_score <- function( #' page_rank(g3, personalized = reset)$vector #' @family centrality #' @export -#' @cdocs igraph_personalized_pagerank page_rank <- function( graph, algo = c("prpack", "arpack"), @@ -1749,7 +1744,6 @@ page_rank <- function( #' harmonic_centrality(g2, mode = "out") #' harmonic_centrality(g %du% make_full_graph(5), mode = "all") #' -#' @cdocs igraph_harmonic_centrality_cutoff harmonic_centrality <- function( graph, vids = V(graph), diff --git a/R/centralization.R b/R/centralization.R index a114539104..bd6dfb570e 100644 --- a/R/centralization.R +++ b/R/centralization.R @@ -314,7 +314,6 @@ NULL #' g1 <- make_star(10, mode = "undirected") #' centr_eigen(g0)$centralization #' centr_eigen(g1)$centralization -#' @cdocs igraph_centralization centralize <- function(scores, theoretical.max = 0, normalized = TRUE) { centralization_impl( scores = scores, @@ -362,7 +361,6 @@ centralize <- function(scores, theoretical.max = 0, normalized = TRUE) { #' centr_clo(g, mode = "all")$centralization #' centr_betw(g, directed = FALSE)$centralization #' centr_eigen(g, directed = FALSE)$centralization -#' @cdocs igraph_centralization_degree centr_degree <- function( graph, mode = c("all", "out", "in", "total"), @@ -511,7 +509,6 @@ centr_betw <- function(graph, directed = TRUE, normalized = TRUE) { #' centr_betw(g, normalized = FALSE)$centralization %>% #' `/`(centr_betw_tmax(g)) #' centr_betw(g, normalized = TRUE)$centralization -#' @cdocs igraph_centralization_betweenness_tmax centr_betw_tmax <- function(graph = NULL, nodes = 0, directed = TRUE) { centralization_betweenness_tmax_impl( graph = graph, @@ -556,7 +553,6 @@ centr_betw_tmax <- function(graph = NULL, nodes = 0, directed = TRUE) { #' centr_clo(g, mode = "all")$centralization #' centr_betw(g, directed = FALSE)$centralization #' centr_eigen(g, directed = FALSE)$centralization -#' @cdocs igraph_centralization_closeness centr_clo <- function( graph, mode = c("out", "in", "all", "total"), @@ -593,7 +589,6 @@ centr_clo <- function( #' centr_clo(g, normalized = FALSE)$centralization %>% #' `/`(centr_clo_tmax(g)) #' centr_clo(g, normalized = TRUE)$centralization -#' @cdocs igraph_centralization_closeness_tmax centr_clo_tmax <- function( graph = NULL, nodes = 0, @@ -655,7 +650,6 @@ centr_clo_tmax <- function( #' g1 <- make_star(10, mode = "undirected") #' centr_eigen(g0)$centralization #' centr_eigen(g1)$centralization -#' @cdocs igraph_centralization_eigenvector_centrality centr_eigen <- function( graph, directed = FALSE, @@ -707,7 +701,6 @@ centr_eigen <- function( #' centr_eigen(g, normalized = FALSE)$centralization %>% #' `/`(centr_eigen_tmax(g)) #' centr_eigen(g, normalized = TRUE)$centralization -#' @cdocs igraph_centralization_eigenvector_centrality_tmax centr_eigen_tmax <- function( graph = NULL, nodes = 0, diff --git a/R/cliques.R b/R/cliques.R index 1bd3a52c30..716d6d5033 100644 --- a/R/cliques.R +++ b/R/cliques.R @@ -238,7 +238,6 @@ clique.number <- function(graph) { #' #' # Check that all returned vertex sets are indeed cliques #' all(sapply(max_cliques(g), function (c) is_clique(g, c))) -#' @cdocs igraph_cliques cliques <- function(graph, min = 0, max = 0) { cliques_impl( graph = graph, @@ -249,7 +248,6 @@ cliques <- function(graph, min = 0, max = 0) { #' @rdname cliques #' @export -#' @cdocs igraph_largest_cliques largest_cliques <- function(graph) { largest_cliques_impl( graph = graph @@ -361,7 +359,6 @@ count_max_cliques <- function(graph, min = NULL, max = NULL, subset = NULL) { #' @rdname cliques #' @export -#' @cdocs igraph_clique_number clique_num <- function(graph) { clique_number_impl( graph = graph @@ -418,7 +415,6 @@ clique_num <- function(graph) { #' weighted_cliques(g, maximal = TRUE) #' largest_weighted_cliques(g) #' weighted_clique_num(g) -#' @cdocs igraph_weighted_cliques weighted_cliques <- function( graph, vertex.weights = NULL, @@ -436,7 +432,6 @@ weighted_cliques <- function( } #' @export #' @rdname cliques -#' @cdocs igraph_largest_weighted_cliques largest_weighted_cliques <- function(graph, vertex.weights = NULL) { largest_weighted_cliques_impl( graph = graph, @@ -445,7 +440,6 @@ largest_weighted_cliques <- function(graph, vertex.weights = NULL) { } #' @export #' @rdname cliques -#' @cdocs igraph_weighted_clique_number weighted_clique_num <- function(graph, vertex.weights = NULL) { weighted_clique_number_impl( graph = graph, @@ -590,8 +584,6 @@ independence_number <- ivs_size #' @rdname cliques #' @export -#' @cdocs igraph_maximal_cliques_hist -#' @cdocs igraph_clique_size_hist clique_size_counts <- function(graph, min = 0, max = 0, maximal = FALSE) { if (maximal) { maximal_cliques_hist_impl( @@ -620,7 +612,6 @@ clique_size_counts <- function(graph, min = 0, max = 0, maximal = FALSE) { #' @keywords graphs #' @seealso [make_full_graph()] #' @export -#' @cdocs igraph_is_complete #' @examples #' #' g <- make_full_graph(6, directed = TRUE) @@ -648,7 +639,6 @@ is_complete <- function(graph) { #' a clique. #' @keywords graphs #' @export -#' @cdocs igraph_is_clique is_clique <- function(graph, candidate, directed = FALSE) { is_clique_impl( graph = graph, @@ -665,7 +655,6 @@ is_clique <- function(graph, candidate, directed = FALSE) { #' independent set. #' @keywords graphs #' @export -#' @cdocs igraph_is_independent_vertex_set is_ivs <- function(graph, candidate) { is_independent_vertex_set_impl( graph = graph, diff --git a/R/coloring.R b/R/coloring.R index 888380298b..f68804f728 100644 --- a/R/coloring.R +++ b/R/coloring.R @@ -30,7 +30,6 @@ #' col <- greedy_vertex_coloring(g) #' plot(g, vertex.color = col) #' -#' @cdocs igraph_vertex_coloring_greedy greedy_vertex_coloring <- function( graph, heuristic = c("colored_neighbors", "dsatur") diff --git a/R/community.R b/R/community.R index 4bd1536ec7..ccad356509 100644 --- a/R/community.R +++ b/R/community.R @@ -3196,7 +3196,6 @@ communities <- groups.communities #' #' @export #' @family functions for manipulating graph structure -#' @cdocs igraph_contract_vertices contract <- function( graph, mapping, @@ -3252,7 +3251,6 @@ contract <- function( #' #' @export #' @family community -#' @cdocs igraph_voronoi voronoi_cells <- function( graph, generators, diff --git a/R/components.R b/R/components.R index ffe1459634..252b8a65f8 100644 --- a/R/components.R +++ b/R/components.R @@ -256,7 +256,6 @@ decompose <- function( #' #' @family components #' @export -#' @cdocs igraph_articulation_points articulation_points <- function(graph) { articulation_points_impl( graph = graph @@ -265,7 +264,6 @@ articulation_points <- function(graph) { #' @rdname articulation_points #' @export -#' @cdocs igraph_bridges bridges <- function(graph) { bridges_impl( graph = graph @@ -320,7 +318,6 @@ bridges <- function(graph) { #' bc <- biconnected_components(g) #' @family components #' @export -#' @cdocs igraph_biconnected_components biconnected_components <- function(graph) { # Function call res <- biconnected_components_impl( @@ -392,7 +389,6 @@ biconnected_components <- function(graph) { #' is_biconnected(make_full_graph(2)) #' @family components #' @export -#' @cdocs igraph_is_biconnected is_biconnected <- function(graph) { is_biconnected_impl( graph = graph diff --git a/R/conversion.R b/R/conversion.R index 5ae9719dfc..d36d030469 100644 --- a/R/conversion.R +++ b/R/conversion.R @@ -599,7 +599,6 @@ as_edgelist <- function(graph, names = TRUE) { #' ) #' print(ug4, e = TRUE) #' -#' @cdocs igraph_to_directed as_directed <- function( graph, mode = c("mutual", "arbitrary", "random", "acyclic") @@ -1274,7 +1273,6 @@ as_data_frame <- function(x, what = c("edges", "vertices", "both")) { #' which_multiple(g3) #' @family conversion #' @export -#' @cdocs igraph_adjlist graph_from_adj_list <- function( adjlist, mode = c("out", "in", "all", "total"), diff --git a/R/cycles.R b/R/cycles.R index 8603764283..028aa8fc68 100644 --- a/R/cycles.R +++ b/R/cycles.R @@ -47,7 +47,6 @@ #' find_cycle(sample_tree(5)) #' #' @family cycles -#' @cdocs igraph_find_cycle #' @export find_cycle <- function(graph, mode = c("out", "in", "all", "total")) { @@ -85,7 +84,6 @@ find_cycle <- function(graph, mode = c("out", "in", "all", "total")) { #' simple_cycles(g, mode = "all", min = 2, max = 3) # limit cycle lengths #' #' @family cycles -#' @cdocs igraph_simple_cycles #' @export simple_cycles <- function( diff --git a/R/degseq.R b/R/degseq.R index ad52497c50..76a4401822 100644 --- a/R/degseq.R +++ b/R/degseq.R @@ -139,7 +139,6 @@ is_degseq <- function(out.deg, in.deg = NULL) { #' is_degseq(degree(g)) #' is_graphical(degree(g)) #' @export -#' @cdocs igraph_is_graphical is_graphical <- function( out.deg, in.deg = NULL, diff --git a/R/efficiency.R b/R/efficiency.R index bb7e7a0df2..b864dc86f2 100644 --- a/R/efficiency.R +++ b/R/efficiency.R @@ -66,7 +66,6 @@ #' g <- make_graph("zachary") #' global_efficiency(g) #' average_local_efficiency(g) -#' @cdocs igraph_global_efficiency global_efficiency <- function(graph, weights = NULL, directed = TRUE) { global_efficiency_impl( graph = graph, @@ -77,7 +76,6 @@ global_efficiency <- function(graph, weights = NULL, directed = TRUE) { #' @rdname global_efficiency #' @export -#' @cdocs igraph_local_efficiency local_efficiency <- function( graph, vids = V(graph), @@ -96,7 +94,6 @@ local_efficiency <- function( #' @rdname global_efficiency #' @export -#' @cdocs igraph_average_local_efficiency average_local_efficiency <- function( graph, weights = NULL, diff --git a/R/embedding.R b/R/embedding.R index 406f7338aa..b5cc24831e 100644 --- a/R/embedding.R +++ b/R/embedding.R @@ -101,7 +101,6 @@ #' embed <- embed_adjacency_matrix(RDP, 5) #' @family embedding #' @export -#' @cdocs igraph_adjacency_spectral_embedding embed_adjacency_matrix <- function( graph, no, @@ -181,7 +180,6 @@ embed_adjacency_matrix <- function( #' #' @family embedding #' @export -#' @cdocs igraph_dim_select dim_select <- function(sv) { dim_select_impl( sv = sv @@ -277,7 +275,6 @@ dim_select <- function(sv) { #' RDP <- sample_dot_product(lpvs) #' embed <- embed_laplacian_matrix(RDP, 5) #' @family embedding -#' @cdocs igraph_laplacian_spectral_embedding embed_laplacian_matrix <- function( graph, no, diff --git a/R/eulerian.R b/R/eulerian.R index 592209653b..64bd373721 100644 --- a/R/eulerian.R +++ b/R/eulerian.R @@ -66,7 +66,6 @@ #' #' @family cycles #' @export -#' @cdocs igraph_is_eulerian has_eulerian_path <- function(graph) { res <- is_eulerian_impl( graph = graph @@ -76,7 +75,6 @@ has_eulerian_path <- function(graph) { #' @rdname has_eulerian_path #' @export -#' @cdocs igraph_is_eulerian has_eulerian_cycle <- function(graph) { res <- is_eulerian_impl( graph = graph @@ -86,7 +84,6 @@ has_eulerian_cycle <- function(graph) { #' @rdname has_eulerian_path #' @export -#' @cdocs igraph_eulerian_path eulerian_path <- function(graph) { eulerian_path_impl( graph = graph @@ -95,7 +92,6 @@ eulerian_path <- function(graph) { #' @rdname has_eulerian_path #' @export -#' @cdocs igraph_eulerian_cycle eulerian_cycle <- function(graph) { eulerian_cycle_impl( graph = graph diff --git a/R/flow.R b/R/flow.R index e569a0e13a..83422c6904 100644 --- a/R/flow.R +++ b/R/flow.R @@ -741,7 +741,6 @@ cohesion.igraph <- function(x, checks = TRUE, ...) { #' st_cuts(g2, source = "s", target = "t") #' @family flow #' @export -#' @cdocs igraph_all_st_cuts st_cuts <- function(graph, source, target) { all_st_cuts_impl( graph = graph, @@ -805,7 +804,6 @@ st_cuts <- function(graph, source, target) { #' st_min_cuts(g, source = "s", target = "t") #' @family flow #' @export -#' @cdocs igraph_all_st_mincuts st_min_cuts <- function(graph, source, target, capacity = NULL) { all_st_mincuts_impl( graph = graph, @@ -954,7 +952,6 @@ dominator_tree <- function(graph, root, mode = c("out", "in", "all", "total")) { #' min_st_separators(g) #' ``` #' @family flow -#' @cdocs igraph_all_minimal_st_separators min_st_separators <- function(graph) { all_minimal_st_separators_impl( graph = graph @@ -1026,7 +1023,6 @@ min_st_separators <- function(graph) { #' max_flow(g1, source = V(g1)["1"], target = V(g1)["2"]) #' @family flow #' @export -#' @cdocs igraph_maxflow max_flow <- function(graph, source, target, capacity = NULL) { maxflow_impl( graph = graph, @@ -1062,7 +1058,6 @@ max_flow <- function(graph, source, target, capacity = NULL) { #' is_separator(ring, c(2, 3)) #' #' @export -#' @cdocs igraph_is_separator is_separator <- function(graph, candidate) { is_separator_impl( graph = graph, @@ -1116,7 +1111,6 @@ is_separator <- function(graph, candidate) { #' #' @family flow #' @export -#' @cdocs igraph_is_minimal_separator is_min_separator <- function(graph, candidate) { is_minimal_separator_impl( graph = graph, @@ -1192,7 +1186,6 @@ is_min_separator <- function(graph, candidate) { #' John - Gery:Russ:Michael #' ) #' min_separators(camp) -#' @cdocs igraph_minimum_size_separators min_separators <- function(graph) { minimum_size_separators_impl( graph = graph diff --git a/R/foreign.R b/R/foreign.R index 57a927759c..ebf9280b01 100644 --- a/R/foreign.R +++ b/R/foreign.R @@ -303,9 +303,6 @@ write.graph.fromraw <- function(buffer, file) { #' @keywords graphs #' @family foreign #' @export -#' @cdocs igraph_read_graph_dimacs_flow igraph_read_graph_dl igraph_read_graph_edgelist -#' @cdocs igraph_read_graph_gml igraph_read_graph_graphdb igraph_read_graph_graphml -#' @cdocs igraph_read_graph_lgl igraph_read_graph_ncol igraph_read_graph_pajek read_graph <- function( file, format = c( @@ -456,9 +453,6 @@ read_graph <- function( #' @family foreign #' @export #' @keywords graphs -#' @cdocs igraph_write_graph_dimacs_flow igraph_write_graph_dot igraph_write_graph_edgelist -#' @cdocs igraph_write_graph_gml igraph_write_graph_graphml igraph_write_graph_leda -#' @cdocs igraph_write_graph_lgl igraph_write_graph_ncol igraph_write_graph_pajek #' @examples #' #' g <- make_ring(10) diff --git a/R/games.R b/R/games.R index 5e95805757..470a38069f 100644 --- a/R/games.R +++ b/R/games.R @@ -1481,7 +1481,6 @@ degseq <- function(..., deterministic = FALSE) { #' g <- sample_growing(500, citation = FALSE) #' g2 <- sample_growing(500, citation = TRUE) #' -#' @cdocs igraph_growing_random_game sample_growing <- function(n, m = 1, ..., directed = TRUE, citation = FALSE) { check_dots_empty() growing_random_game_impl( @@ -2715,7 +2714,6 @@ sample_bipartite_gnp <- function( #' g #' @family games #' @export -#' @cdocs igraph_sbm_game sample_sbm <- function( n, pref.matrix, @@ -2787,8 +2785,6 @@ sbm <- function(n, pref.matrix, block.sizes, directed = FALSE, loops = FALSE) { #' image(g[]) #' @family games #' @export -#' @cdocs igraph_hsbm_game -#' @cdocs igraph_hsbm_list_game sample_hierarchical_sbm <- function(n, m, rho, C, p) { mlen <- length(m) rholen <- if (is.list(rho)) length(rho) else 1 @@ -2884,7 +2880,6 @@ hierarchical_sbm <- function(n, m, rho, C, p) { #' g2 #' @family games #' @export -#' @cdocs igraph_dot_product_game sample_dot_product <- function(vecs, directed = FALSE) { dot_product_game_impl( vecs = vecs, @@ -2922,7 +2917,6 @@ dot_product <- function(vecs, directed = FALSE) { #' @keywords graphs #' @family games #' @export -#' @cdocs igraph_simple_interconnected_islands_game sample_islands <- function(islands.n, islands.size, islands.pin, n.inter) { res <- simple_interconnected_islands_game_impl( islands_n = islands.n, @@ -2978,7 +2972,6 @@ sample_islands <- function(islands.n, islands.size, islands.pin, n.inter) { #' sapply(k10, plot, vertex.label = NA) #' @family games #' @export -#' @cdocs igraph_k_regular_game sample_k_regular <- function( no.of.nodes, k, @@ -3139,7 +3132,6 @@ sample_k_regular <- function( #' degree(sample_chung_lu(c(1, 3, 2, 1), c(2, 1, 2, 2), variant = "maxent"), mode = "out") #' )) #' @export -#' @cdocs igraph_chung_lu_game sample_chung_lu <- function( out.weights, in.weights = NULL, @@ -3234,7 +3226,6 @@ chung_lu <- function( #' g <- sample_fitness(5 * N, sample((1:50)^-2, N, replace = TRUE)) #' degree_distribution(g) #' plot(degree_distribution(g, cumulative = TRUE), log = "xy") -#' @cdocs igraph_static_fitness_game sample_fitness <- function( no.of.edges, fitness.out, @@ -3312,7 +3303,6 @@ sample_fitness <- function( #' #' g <- sample_fitness_pl(10000, 30000, 2.2, 2.3) #' plot(degree_distribution(g, cumulative = TRUE, mode = "out"), log = "xy") -#' @cdocs igraph_static_power_law_game sample_fitness_pl <- function( no.of.nodes, no.of.edges, @@ -3402,7 +3392,6 @@ sample_fitness_pl <- function( #' # Note that some in- or out-degrees are zero which will be excluded from the logarithmic plot. #' plot(seq(along.with = dd1) - 1, dd1, log = "xy") #' points(seq(along.with = dd2) - 1, dd2, col = 2, pch = 2) -#' @cdocs igraph_forest_fire_game sample_forestfire <- function( nodes, fw.prob, @@ -3464,7 +3453,6 @@ sample_forestfire <- function( #' cor(as.vector(g[]), as.vector(g2[])) #' g #' g2 -#' @cdocs igraph_correlated_game sample_correlated_gnp <- function( old.graph, corr, @@ -3514,7 +3502,6 @@ sample_correlated_gnp <- function( #' ) #' gg #' cor(as.vector(gg[[1]][]), as.vector(gg[[2]][])) -#' @cdocs igraph_correlated_pair_game sample_correlated_gnp_pair <- function( n, corr, diff --git a/R/glet.R b/R/glet.R index 477061d1f4..252b227cfe 100644 --- a/R/glet.R +++ b/R/glet.R @@ -229,7 +229,6 @@ function() { #' @rdname graphlet_basis #' @export -#' @cdocs igraph_graphlets graphlets <- function(graph, weights = NULL, niter = 1000) { graphlets_impl( graph = graph, diff --git a/R/hrg.R b/R/hrg.R index 3a3fbfb5a9..b8eb3c4a86 100644 --- a/R/hrg.R +++ b/R/hrg.R @@ -304,7 +304,6 @@ fit_hrg <- function(graph, hrg = NULL, start = FALSE, steps = 0) { #' } #' @family hierarchical random graph functions #' @export -#' @cdocs igraph_hrg_consensus consensus_tree <- function( graph, hrg = NULL, @@ -334,7 +333,6 @@ consensus_tree <- function( #' #' @family hierarchical random graph functions #' @export -#' @cdocs igraph_hrg_create hrg <- function(graph, prob) { hrg_create_impl( graph = graph, @@ -353,7 +351,6 @@ hrg <- function(graph, prob) { #' #' @family hierarchical random graph functions #' @export -#' @cdocs igraph_from_hrg_dendrogram hrg_tree <- function(hrg) { if (!inherits(hrg, "igraphHRG")) { cli::cli_abort( @@ -380,7 +377,6 @@ hrg_tree <- function(hrg) { #' #' @family hierarchical random graph functions #' @export -#' @cdocs igraph_hrg_game sample_hrg <- function(hrg) { if (!inherits(hrg, "igraphHRG")) { cli::cli_abort( diff --git a/R/interface.R b/R/interface.R index ef105e8921..3b994290dc 100644 --- a/R/interface.R +++ b/R/interface.R @@ -605,7 +605,6 @@ get.edge.ids <- function( #' g <- make_ring(10) #' gorder(g) #' vcount(g) -#' @cdocs igraph_vcount vcount <- function(graph) { as.numeric(vcount_impl( graph = graph diff --git a/R/make.R b/R/make.R index b5f2bdfb07..4ae8923f70 100644 --- a/R/make.R +++ b/R/make.R @@ -402,7 +402,6 @@ graph.lcf <- function(n, shifts, repeats = 1) { #' @inheritParams make_lattice #' @keywords internal #' @export -#' @cdocs igraph_square_lattice graph.lattice <- function( dimvector = NULL, length = NULL, @@ -1596,7 +1595,6 @@ undirected_graph <- function(...) constructor_spec(make_undirected_graph, ...) #' @examples #' make_empty_graph(n = 10) #' make_empty_graph(n = 5, directed = FALSE) -#' @cdocs igraph_empty make_empty_graph <- function(n = 0, directed = TRUE) { if (!is.numeric(n)) { cli::cli_abort("{.arg n} must be numeric, not {.obj_type_friendly {n}}.") @@ -1966,7 +1964,6 @@ full_graph <- function(n, directed = FALSE, loops = FALSE) { #' @examples #' make_lattice(c(5, 5, 5)) #' make_lattice(length = 5, dim = 3) -#' @cdocs igraph_square_lattice make_lattice <- function( dimvector = NULL, length = NULL, @@ -2125,7 +2122,6 @@ ring <- function(n, directed = FALSE, mutual = FALSE, circular = TRUE) { #' @examples #' make_wheel(10, mode = "out") #' make_wheel(5, mode = "undirected") -#' @cdocs igraph_wheel make_wheel <- function( n, ..., @@ -2231,7 +2227,6 @@ make_tree <- function(n, children = 2, mode = c("out", "in", "undirected")) { #' g <- sample_tree(100, method = "lerw") #' #' @export -#' @cdocs igraph_tree_game sample_tree <- function(n, directed = FALSE, method = c("lerw", "prufer")) { tree_game_impl( n = n, @@ -2272,7 +2267,6 @@ tree <- function(...) { #' to_prufer(g) #' @family trees #' @export -#' @cdocs igraph_from_prufer make_from_prufer <- function(prufer) { from_prufer_impl( prufer = prufer @@ -2763,7 +2757,6 @@ bipartite_graph <- function(types, edges, directed = FALSE) { #' # Create a directed multipartite graph #' g2 <- make_full_multipartite(c(2, 2, 2), directed = TRUE, mode = "out") #' plot(g2) -#' @cdocs igraph_full_multipartite make_full_multipartite <- function( n, directed = FALSE, @@ -2833,7 +2826,6 @@ full_multipartite <- function( #' #' # The sizes of the partitions are as balanced as possible #' table(V(g)$type) -#' @cdocs igraph_turan make_turan <- function(n, r) { n <- as.numeric(n) r <- as.numeric(r) @@ -2922,7 +2914,6 @@ full_citation_graph <- function(n, directed = TRUE) { #' g2 <- make_graph("Franklin") #' isomorphic(g1, g2) #' @export -#' @cdocs igraph_lcf_vector graph_from_lcf <- function( shifts, ..., @@ -3047,7 +3038,6 @@ graph_from_lcf <- function( #' } #' g5 <- realize_degseq(degs, allowed.edge.types = "multi") #' all(degree(g5) == degs) -#' @cdocs igraph_realize_degree_sequence realize_degseq <- function( out.deg, in.deg = NULL, @@ -3112,7 +3102,6 @@ realize_degseq <- function( #' @examples #' g <- realize_bipartite_degseq(c(3, 3, 2, 1, 1), c(2, 2, 2, 2, 2)) #' degree(g) -#' @cdocs igraph_realize_bipartite_degree_sequence realize_bipartite_degseq <- function( degrees1, degrees2, diff --git a/R/motifs.R b/R/motifs.R index 932c6740e8..4228817b26 100644 --- a/R/motifs.R +++ b/R/motifs.R @@ -304,7 +304,6 @@ sample_motifs <- function( #' dyad_census(g) #' @family graph motifs #' @export -#' @cdocs igraph_dyad_census dyad_census <- function(graph) { if (!is_directed(graph)) { warn("`dyad_census()` requires a directed graph.") @@ -396,7 +395,6 @@ dyad_census <- function(graph) { #' triad_census(g) #' @family motifs #' @export -#' @cdocs igraph_triad_census triad_census <- function(graph) { triad_census_impl( graph = graph @@ -426,7 +424,6 @@ triad_census <- function(graph) { #' #' @export #' @family graph motifs -#' @cdocs igraph_motifs_randesu_callback #' #' @examples #' g <- sample_pa(100) diff --git a/R/operators.R b/R/operators.R index 499f37cc62..4305623cd4 100644 --- a/R/operators.R +++ b/R/operators.R @@ -1347,7 +1347,6 @@ rep.igraph <- function(x, n, mark = TRUE, ...) { #' reverse_edges(g, 2) #' @family functions for manipulating graph structure #' @export -#' @cdocs igraph_reverse_edges reverse_edges <- function(graph, eids = E(graph)) { reverse_edges_impl( graph = graph, diff --git a/R/other.R b/R/other.R index 2db5af9584..a10c92ace3 100644 --- a/R/other.R +++ b/R/other.R @@ -224,7 +224,6 @@ igraph.i.spMatrix <- function(M) { #' convex_hull(M) #' @family other #' @export -#' @cdocs igraph_convex_hull convex_hull <- function(data) { convex_hull_2d_impl( data = data diff --git a/R/paths.R b/R/paths.R index 972bcc136b..093efd56d3 100644 --- a/R/paths.R +++ b/R/paths.R @@ -159,7 +159,6 @@ all_simple_paths <- function( #' @family cycles #' @family structural.properties #' @export -#' @cdocs igraph_is_dag is_dag <- function(graph) { is_dag_impl( graph = graph @@ -186,7 +185,6 @@ is_dag <- function(graph) { #' @family cycles #' @family structural.properties #' @export -#' @cdocs igraph_is_acyclic is_acyclic <- function(graph) { is_acyclic_impl( graph = graph @@ -247,7 +245,6 @@ is_acyclic <- function(graph) { #' max_cardinality(g2) #' is_chordal(g2, fillin = TRUE) #' @family chordal -#' @cdocs igraph_maximum_cardinality_search max_cardinality <- function(graph) { maximum_cardinality_search_impl( graph = graph @@ -282,7 +279,6 @@ max_cardinality <- function(graph) { #' eccentricity(g) #' @family paths #' @export -#' @cdocs igraph_eccentricity_dijkstra eccentricity <- function( graph, vids = V(graph), @@ -342,7 +338,6 @@ eccentricity <- function( #' radius(g) #' @family paths #' @export -#' @cdocs igraph_radius_dijkstra radius <- function( graph, ..., @@ -398,7 +393,6 @@ radius <- function( #' graph_center(ring) #' #' @export -#' @cdocs igraph_graph_center_dijkstra graph_center <- function( graph, ..., @@ -416,7 +410,6 @@ graph_center <- function( #' @param directed Whether to consider directed paths in directed graphs, #' this argument is ignored for undirected graphs. #' @export -#' @cdocs igraph_path_length_hist distance_table <- function(graph, directed = TRUE) { path_length_hist_impl( graph = graph, diff --git a/R/random_walk.R b/R/random_walk.R index bb78e0e517..d6252a5683 100644 --- a/R/random_walk.R +++ b/R/random_walk.R @@ -47,7 +47,6 @@ #' #' ## But these are (almost) the same #' cor(table(w), pg) -#' @cdocs igraph_random_walk random_walk <- function( graph, start, @@ -73,7 +72,6 @@ random_walk <- function( #' @rdname random_walk #' @export -#' @cdocs igraph_random_walk random_edge_walk <- function( graph, start, diff --git a/R/similarity.R b/R/similarity.R index 870d57cbca..4fcb4eb944 100644 --- a/R/similarity.R +++ b/R/similarity.R @@ -43,7 +43,6 @@ #' @keywords graphs #' @family similarity #' @family cocitation -#' @cdocs igraph_similarity_jaccard igraph_similarity_dice igraph_similarity_inverse_log_weighted #' @export #' @examples #' diff --git a/R/simple.R b/R/simple.R index 65bd13d9ea..48126722a4 100644 --- a/R/simple.R +++ b/R/simple.R @@ -88,7 +88,6 @@ is.simple <- function(graph) { #' @family functions for manipulating graph structure #' @family isomorphism #' @export -#' @cdocs igraph_simplify simplify <- function( graph, remove.multiple = TRUE, @@ -105,7 +104,6 @@ simplify <- function( #' @export #' @rdname simplify -#' @cdocs igraph_is_simple is_simple <- function(graph) { is_simple_impl( graph = graph diff --git a/R/sir.R b/R/sir.R index 3bcc86efe3..67a4973b9e 100644 --- a/R/sir.R +++ b/R/sir.R @@ -108,7 +108,6 @@ #' plot(sm) #' @family processes #' @export -#' @cdocs igraph_sir sir <- function(graph, beta, gamma, no.sim = 100) { sir_impl( graph = graph, diff --git a/R/structural-properties.R b/R/structural-properties.R index 3bd2180cd1..55b4f2fa28 100644 --- a/R/structural-properties.R +++ b/R/structural-properties.R @@ -851,7 +851,6 @@ farthest_vertices <- function( #' @export #' @rdname distances -#' @cdocs igraph_average_path_length_dijkstra mean_distance <- function( graph, weights = NULL, @@ -940,7 +939,6 @@ degree <- function( #' @rdname degree #' @export -#' @cdocs igraph_maxdegree max_degree <- function( graph, ..., @@ -958,7 +956,6 @@ max_degree <- function( #' @rdname degree #' @export -#' @cdocs igraph_mean_degree mean_degree <- function(graph, loops = TRUE) { mean_degree_impl( graph = graph, @@ -1474,7 +1471,6 @@ all_shortest_paths <- function( #' @family structural.properties #' @seealso [shortest_paths()], [all_shortest_paths()] #' @keywords graphs -#' @cdocs igraph_get_k_shortest_paths k_shortest_paths <- function( graph, from, @@ -1988,7 +1984,6 @@ constraint <- function(graph, nodes = V(graph), weights = NULL) { #' g <- sample_gnp(20, 5 / 20, directed = TRUE) #' reciprocity(g) #' -#' @cdocs igraph_reciprocity reciprocity <- function( graph, ignore.loops = TRUE, @@ -2039,7 +2034,6 @@ reciprocity <- function( #' edge_density(g, loops = TRUE) # this is right!!! #' edge_density(simplify(g), loops = FALSE) # this is also right, but different #' -#' @cdocs igraph_density edge_density <- function(graph, loops = FALSE) { density_impl( graph = graph, @@ -2351,7 +2345,6 @@ topo_sort <- function(graph, mode = c("out", "all", "in")) { #' g <- sample_gnm(20, 40, directed = TRUE) #' feedback_arc_set(g) #' feedback_arc_set(g, algo = "approx_eades") -#' @cdocs igraph_feedback_arc_set feedback_arc_set <- function( graph, weights = NULL, @@ -2392,7 +2385,6 @@ feedback_arc_set <- function( #' #' g <- make_lattice(c(3,3)) #' feedback_vertex_set(g) -#' @cdocs igraph_feedback_vertex_set feedback_vertex_set <- function(graph, weights = NULL, algo = c("exact_ip")) { feedback_vertex_set_impl( graph = graph, @@ -2529,7 +2521,6 @@ girth <- function(graph, circle = TRUE) { #' any(which_multiple(g)) #' E(g)$weight #' -#' @cdocs igraph_is_multiple which_multiple <- function(graph, eids = E(graph)) { is_multiple_impl( graph = graph, @@ -2538,7 +2529,6 @@ which_multiple <- function(graph, eids = E(graph)) { } #' @rdname which_multiple #' @export -#' @cdocs igraph_has_multiple any_multiple <- function(graph) { has_multiple_impl( graph = graph @@ -2546,7 +2536,6 @@ any_multiple <- function(graph) { } #' @rdname which_multiple #' @export -#' @cdocs igraph_count_multiple count_multiple <- function(graph, eids = E(graph)) { count_multiple_impl( graph = graph, @@ -2555,7 +2544,6 @@ count_multiple <- function(graph, eids = E(graph)) { } #' @rdname which_multiple #' @export -#' @cdocs igraph_is_loop which_loop <- function(graph, eids = E(graph)) { is_loop_impl( graph = graph, @@ -2564,7 +2552,6 @@ which_loop <- function(graph, eids = E(graph)) { } #' @rdname which_multiple #' @export -#' @cdocs igraph_has_loop any_loop <- function(graph) { has_loop_impl( graph = graph @@ -2572,7 +2559,6 @@ any_loop <- function(graph) { } #' @rdname which_multiple #' @export -#' @cdocs igraph_count_loops count_loops <- function(graph) { count_loops_impl( graph = graph @@ -3166,7 +3152,6 @@ components <- function(graph, mode = c("weak", "strong")) { #' @rdname components #' @export -#' @cdocs igraph_is_connected is_connected <- function(graph, mode = c("weak", "strong")) { is_connected_impl( graph = graph, @@ -3228,7 +3213,6 @@ count_components <- function(graph, mode = c("weak", "strong")) { #' g3 <- make_graph(~ 1 - 2 - 3, 4 - 5, 6) #' count_reachable(g3, mode = "all") #' -#' @cdocs igraph_count_reachable count_reachable <- function(graph, mode = c("out", "in", "all", "total")) { count_reachable_impl( graph = graph, @@ -3342,8 +3326,6 @@ unfold_tree <- function(graph, mode = c("all", "out", "in", "total"), roots) { #' laplacian_matrix(g, normalization = "unnormalized") #' laplacian_matrix(g, normalization = "unnormalized", sparse = FALSE) #' -#' @cdocs igraph_get_laplacian -#' @cdocs igraph_get_laplacian_sparse laplacian_matrix <- function( graph, weights = NULL, @@ -3593,7 +3575,6 @@ max_bipartite_match <- function( #' sum(which_mutual(g)) / 2 == dyad_census(g)$mut #' @family structural.properties #' @export -#' @cdocs igraph_is_mutual which_mutual <- function(graph, eids = E(graph), loops = TRUE) { is_mutual_impl( graph = graph, @@ -3677,7 +3658,6 @@ which_mutual <- function(graph, eids = E(graph), loops = TRUE) { #' knn(g5) #' @family structural.properties #' @export -#' @cdocs igraph_avg_nearest_neighbor_degree knn <- function( graph, vids = V(graph), diff --git a/R/structure.info.R b/R/structure.info.R index fd09d1c47f..813a2a9f93 100644 --- a/R/structure.info.R +++ b/R/structure.info.R @@ -58,7 +58,6 @@ are.connected <- function(graph, v1, v2) { #' dg #' are_adjacent(ug, 1, 2) #' are_adjacent(ug, 2, 1) -#' @cdocs igraph_are_adjacent are_adjacent <- function(graph, v1, v2) { are_adjacent_impl( graph = graph, diff --git a/R/topology.R b/R/topology.R index 1be2eaa32f..e7640e58b2 100644 --- a/R/topology.R +++ b/R/topology.R @@ -383,7 +383,6 @@ isomorphic <- function( } #' @export -#' @cdocs igraph_isomorphic_bliss graph.isomorphic.bliss <- function( graph1, graph2, @@ -400,7 +399,6 @@ graph.isomorphic.bliss <- function( ) } #' @export -#' @cdocs igraph_isomorphic_vf2 graph.isomorphic.vf2 <- function( graph1, graph2, @@ -427,7 +425,6 @@ graph.isomorphic.vf2 <- function( ) } #' @export -#' @cdocs igraph_subisomorphic_vf2 graph.subisomorphic.vf2 <- function( graph1, graph2, @@ -625,7 +622,6 @@ count_isomorphisms <- function(graph1, graph2, method = "vf2", ...) { } #' @export -#' @cdocs igraph_count_isomorphisms_vf2 graph.count.isomorphisms.vf2 <- function( graph1, graph2, @@ -732,7 +728,6 @@ count_subgraph_isomorphisms <- function( } #' @export -#' @cdocs igraph_count_subisomorphisms_vf2 graph.count.subisomorphisms.vf2 <- function( graph1, graph2, @@ -888,7 +883,6 @@ isomorphism_class <- function(graph, v) { } #' @export -#' @cdocs igraph_isoclass graph.isoclass <- function(graph) { isoclass_impl( graph = graph @@ -911,7 +905,6 @@ graph.isoclass <- function(graph) { #' #' @family graph isomorphism #' @export -#' @cdocs igraph_isoclass_create graph_from_isomorphism_class <- function(size, number, directed = TRUE) { isoclass_create_impl( size = size, @@ -1028,7 +1021,6 @@ graph_from_isomorphism_class <- function(size, number, directed = TRUE) { #' all(el1 == el2) #' @family graph isomorphism #' @export -#' @cdocs igraph_canonical_permutation canonical_permutation <- function( graph, colors = NULL, @@ -1080,7 +1072,6 @@ canonical_permutation <- function( #' all(sort(E(g2)$weight) == sort(E(g)$weight)) #' @export #' @family functions for manipulating graph structure -#' @cdocs igraph_permute_vertices permute <- function(graph, permutation) { permute_vertices_impl( graph = graph, @@ -1089,7 +1080,6 @@ permute <- function(graph, permutation) { } #' @export -#' @cdocs igraph_isomorphic graph.isomorphic <- function(graph1, graph2) { isomorphic_impl( graph1 = graph1, @@ -1180,7 +1170,6 @@ graph.isomorphic <- function(graph1, graph2) { #' count_automorphisms(g, colors = c(1, 2, 1, 2)) #' @family graph automorphism #' @export -#' @cdocs igraph_count_automorphisms count_automorphisms <- function( graph, colors = NULL, @@ -1265,7 +1254,6 @@ count_automorphisms <- function( #' automorphism_group(g) #' @family graph automorphism #' @export -#' @cdocs igraph_automorphism_group automorphism_group <- function( graph, colors = NULL, @@ -1319,7 +1307,6 @@ automorphism_group <- function( #' print_all(tc2) #' @family functions for manipulating graph structure #' @export -#' @cdocs igraph_transitive_closure transitive_closure <- function(graph) { transitive_closure_impl( graph = graph diff --git a/R/trees.R b/R/trees.R index 03adbc86ee..04634991d3 100644 --- a/R/trees.R +++ b/R/trees.R @@ -40,7 +40,6 @@ #' #' @family trees #' @export -#' @cdocs igraph_is_tree is_tree <- function( graph, mode = c("out", "in", "all", "total"), @@ -100,7 +99,6 @@ is_tree <- function( #' #' @family trees #' @export -#' @cdocs igraph_is_forest is_forest <- function( graph, mode = c("out", "in", "all", "total"), @@ -137,7 +135,6 @@ is_forest <- function( #' #' @family trees #' @export -#' @cdocs igraph_to_prufer to_prufer <- function(graph) { to_prufer_impl( graph = graph @@ -170,7 +167,6 @@ to_prufer <- function(graph) { #' #' @family trees #' @export -#' @cdocs igraph_random_spanning_tree sample_spanning_tree <- function(graph, vid = 0) { random_spanning_tree_impl( graph = graph, diff --git a/R/triangles.R b/R/triangles.R index 8321e04479..a318bc66c6 100644 --- a/R/triangles.R +++ b/R/triangles.R @@ -88,7 +88,6 @@ adjacent.triangles <- function(graph, vids = V(graph)) { #' @family triangles #' @export #' @rdname count_triangles -#' @cdocs igraph_list_triangles triangles <- function(graph) { list_triangles_impl( graph = graph @@ -97,7 +96,6 @@ triangles <- function(graph) { #' @export #' @rdname count_triangles -#' @cdocs igraph_adjacent_triangles count_triangles <- function(graph, vids = V(graph)) { count_adjacent_triangles_impl( graph = graph, diff --git a/man/E.Rd b/man/E.Rd index 8266c78271..34545c0cf1 100644 --- a/man/E.Rd +++ b/man/E.Rd @@ -58,6 +58,10 @@ Edge sequences can be used to query or set attributes for the edges in the sequence. See \code{\link[=$.igraph.es]{$.igraph.es()}} for details. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ # Edges of an unnamed graph g <- make_ring(10) diff --git a/man/V.Rd b/man/V.Rd index d682c3468c..7696460ed1 100644 --- a/man/V.Rd +++ b/man/V.Rd @@ -51,6 +51,10 @@ Vertex sequences can be used to query or set attributes for the vertices in the sequence. See \code{\link[=$.igraph.vs]{$.igraph.vs()}} for details. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ # Vertex ids of an unnamed graph g <- make_ring(10) diff --git a/man/add.edges.Rd b/man/add.edges.Rd index 8a4660c337..cee6deb51c 100644 --- a/man/add.edges.Rd +++ b/man/add.edges.Rd @@ -26,4 +26,8 @@ below.} \code{add.edges()} was renamed to \code{\link[=add_edges]{add_edges()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/add.vertices.Rd b/man/add.vertices.Rd index 4782a44a55..4e7de1f513 100644 --- a/man/add.vertices.Rd +++ b/man/add.vertices.Rd @@ -25,4 +25,8 @@ below.} \code{add.vertices()} was renamed to \code{\link[=add_vertices]{add_vertices()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_add_vertices}{\code{add_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/add_edges.Rd b/man/add_edges.Rd index 1dd4efc7f3..e6f7aa2010 100644 --- a/man/add_edges.Rd +++ b/man/add_edges.Rd @@ -33,6 +33,10 @@ to \code{edges[4]}, etc. If attributes are supplied, and they are not present in the graph, their values for the original edges of the graph are set to \code{NA}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_empty_graph(n = 5) \%>\% add_edges(c( diff --git a/man/add_vertices.Rd b/man/add_vertices.Rd index 06b6118787..5ac2eb5fbe 100644 --- a/man/add_vertices.Rd +++ b/man/add_vertices.Rd @@ -27,6 +27,10 @@ If attributes are supplied, and they are not present in the graph, their values for the original vertices of the graph are set to \code{NA}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_add_vertices}{\code{add_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_empty_graph() \%>\% add_vertices(3, color = "red") \%>\% diff --git a/man/adjacent.triangles.Rd b/man/adjacent.triangles.Rd index cc4ea89893..96a89b3ed5 100644 --- a/man/adjacent.triangles.Rd +++ b/man/adjacent.triangles.Rd @@ -20,4 +20,8 @@ named graphs.} \code{adjacent.triangles()} was renamed to \code{\link[=count_triangles]{count_triangles()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/adjacent_vertices.Rd b/man/adjacent_vertices.Rd index 61a934277f..f33f67c290 100644 --- a/man/adjacent_vertices.Rd +++ b/man/adjacent_vertices.Rd @@ -22,6 +22,10 @@ A list of vertex sequences. This function is similar to \code{\link[=neighbors]{neighbors()}}, but it queries the adjacent vertices for multiple vertices at once. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_graph("Zachary") adjacent_vertices(g, c(1, 34)) diff --git a/man/all_simple_paths.Rd b/man/all_simple_paths.Rd index 2f83d84a3d..002f2b91bd 100644 --- a/man/all_simple_paths.Rd +++ b/man/all_simple_paths.Rd @@ -45,6 +45,10 @@ function, if your graph is lattice-like. This function ignores multiple and loop edges. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_all_simple_paths}{\code{get_all_simple_paths()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) diff --git a/man/alpha.centrality.Rd b/man/alpha.centrality.Rd index 530eedc75c..3001a7e0d7 100644 --- a/man/alpha.centrality.Rd +++ b/man/alpha.centrality.Rd @@ -54,4 +54,8 @@ support} \code{alpha.centrality()} was renamed to \code{\link[=alpha_centrality]{alpha_centrality()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}} +} + \keyword{internal} diff --git a/man/alpha_centrality.Rd b/man/alpha_centrality.Rd index b41a3223e0..7101d018d0 100644 --- a/man/alpha_centrality.Rd +++ b/man/alpha_centrality.Rd @@ -73,6 +73,10 @@ endogenous versus exogenous factors. algorithm, the routine may fail is certain cases. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}} +} + \examples{ # The examples from Bonacich's paper diff --git a/man/are.connected.Rd b/man/are.connected.Rd index 1452add865..4b9da7a570 100644 --- a/man/are.connected.Rd +++ b/man/are.connected.Rd @@ -19,4 +19,8 @@ are.connected(graph, v1, v2) \code{are.connected()} was renamed to \code{\link[=are_adjacent]{are_adjacent()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_are_adjacent}{\code{are_adjacent()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/are_adjacent.Rd b/man/are_adjacent.Rd index 8a57057f4e..a68833632f 100644 --- a/man/are_adjacent.Rd +++ b/man/are_adjacent.Rd @@ -20,6 +20,10 @@ A logical scalar, \code{TRUE} if edge \verb{(v1, v2)} exists in the graph. The order of the vertices only matters in directed graphs, where the existence of a directed \verb{(v1, v2)} edge is queried. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_are_adjacent}{\code{are_adjacent()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ug <- make_ring(10) ug @@ -48,5 +52,3 @@ Other structural queries: \code{\link{tail_of}()} } \concept{structural queries} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_are_adjacent}{\code{are_adjacent()}}.} - diff --git a/man/articulation.points.Rd b/man/articulation.points.Rd index 90a5009d20..b9470f21ed 100644 --- a/man/articulation.points.Rd +++ b/man/articulation.points.Rd @@ -16,4 +16,8 @@ it is directed.} \code{articulation.points()} was renamed to \code{\link[=articulation_points]{articulation_points()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_articulation_points}{\code{articulation_points()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/articulation_points.Rd b/man/articulation_points.Rd index aea6979305..3108a69c90 100644 --- a/man/articulation_points.Rd +++ b/man/articulation_points.Rd @@ -30,6 +30,10 @@ articulation point or a single bridge makes it disconnected. If a graph contains no articulation points, then its vertex connectivity is at least two. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_articulation_points}{\code{articulation_points()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_bridges}{\code{bridges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- disjoint_union(make_full_graph(5), make_full_graph(5)) @@ -58,5 +62,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{components} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_articulation_points}{\code{articulation_points()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_bridges}{\code{bridges()}}.} - diff --git a/man/as.directed.Rd b/man/as.directed.Rd index 0d38ae8a78..8ac75c1a66 100644 --- a/man/as.directed.Rd +++ b/man/as.directed.Rd @@ -20,4 +20,8 @@ as.directed(graph, mode = c("mutual", "arbitrary", "random", "acyclic")) \code{as.directed()} was renamed to \code{\link[=as_directed]{as_directed()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_to_directed}{\code{to_directed()}} +} + \keyword{internal} diff --git a/man/as.igraph.Rd b/man/as.igraph.Rd index ab519d7219..0be97de994 100644 --- a/man/as.igraph.Rd +++ b/man/as.igraph.Rd @@ -24,6 +24,10 @@ Right now the following objects are supported: \itemize{ \item codeigraphHRG These objects are created by the \code{\link[=fit_hrg]{fit_hrg()}} and \code{\link[=consensus_tree]{consensus_tree()}} functions. } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}} +} + \examples{ g <- make_full_graph(5) + make_full_graph(5) diff --git a/man/as.matrix.igraph.Rd b/man/as.matrix.igraph.Rd index 136377aa4c..5faf9ff53a 100644 --- a/man/as.matrix.igraph.Rd +++ b/man/as.matrix.igraph.Rd @@ -35,6 +35,10 @@ Other arguments passed through \code{...} are passed to either \code{\link[=as_adjacency_matrix]{as_adjacency_matrix()}} or \code{\link[=as_edgelist]{as_edgelist()}} depending on the value of \code{matrix.type}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_graph("zachary") diff --git a/man/as.undirected.Rd b/man/as.undirected.Rd index 8cf4d939fc..31f4780127 100644 --- a/man/as.undirected.Rd +++ b/man/as.undirected.Rd @@ -30,4 +30,8 @@ this.} \code{as.undirected()} was renamed to \code{\link[=as_undirected]{as_undirected()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_to_undirected}{\code{to_undirected()}} +} + \keyword{internal} diff --git a/man/as_adj.Rd b/man/as_adj.Rd index 9de8dba098..9daeecdcef 100644 --- a/man/as_adj.Rd +++ b/man/as_adj.Rd @@ -51,4 +51,8 @@ matrices.} We plan to remove \code{as_adj()} in favor of the more explicitly named \code{as_adjacency_matrix()} so please use \code{as_adjacency_matrix()} instead. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/as_adj_list.Rd b/man/as_adj_list.Rd index 24d1762373..eec1d08b3c 100644 --- a/man/as_adj_list.Rd +++ b/man/as_adj_list.Rd @@ -55,6 +55,10 @@ If \code{igraph_opt("return.vs.es")} is true (default), the numeric vectors of the adjacency lists are coerced to \code{igraph.vs}, this can be a very expensive operation on large graphs. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_ring(10) diff --git a/man/as_adjacency_matrix.Rd b/man/as_adjacency_matrix.Rd index 5f6215049b..cb1d4e0551 100644 --- a/man/as_adjacency_matrix.Rd +++ b/man/as_adjacency_matrix.Rd @@ -60,6 +60,10 @@ regular matrix if \code{sparse} is \code{FALSE}, or a sparse matrix, as defined in the \sQuote{\code{Matrix}} package, if \code{sparse} if \code{TRUE}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- sample_gnp(10, 2 / 10) diff --git a/man/as_biadjacency_matrix.Rd b/man/as_biadjacency_matrix.Rd index c4cd1cd8ca..4722cc4b77 100644 --- a/man/as_biadjacency_matrix.Rd +++ b/man/as_biadjacency_matrix.Rd @@ -52,6 +52,10 @@ Some authors refer to the bipartite adjacency matrix as the "bipartite incidence matrix". igraph 1.6.0 and later does not use this naming to avoid confusion with the edge-vertex incidence matrix. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_get_biadjacency}{\code{get_biadjacency()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_bipartite_graph(c(0, 1, 0, 1, 0, 0), c(1, 2, 2, 3, 3, 4)) diff --git a/man/as_directed.Rd b/man/as_directed.Rd index 78e4fdfe58..3a895065ae 100644 --- a/man/as_directed.Rd +++ b/man/as_directed.Rd @@ -84,6 +84,10 @@ than one mutual edge pairs between the same pair of vertices. } } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_to_directed}{\code{to_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_to_undirected}{\code{to_undirected()}} +} + \examples{ g <- make_ring(10) @@ -137,5 +141,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{conversion} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_to_directed}{\code{to_directed()}}.} - diff --git a/man/as_edgelist.Rd b/man/as_edgelist.Rd index 9708cb7978..51bb352891 100644 --- a/man/as_edgelist.Rd +++ b/man/as_edgelist.Rd @@ -23,6 +23,10 @@ graph, like an edge list. \details{ \code{as_edgelist()} returns the list of edges in a graph. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_gnp(10, 2 / 10) diff --git a/man/as_graphnel.Rd b/man/as_graphnel.Rd index 96650d6746..e5d5eae0e2 100644 --- a/man/as_graphnel.Rd +++ b/man/as_graphnel.Rd @@ -24,6 +24,10 @@ vertex attribute \sQuote{\code{name}}, then it will be used to assign vertex names in the graphNEL graph. Otherwise numeric igraph vertex ids will be used for this purpose. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_multiple}{\code{has_multiple()}} +} + \examples{ \dontshow{if (rlang::is_installed("graph")) withAutoprint(\{ # examplesIf} ## Undirected diff --git a/man/as_incidence_matrix.Rd b/man/as_incidence_matrix.Rd index 697644a63f..fdc9f696af 100644 --- a/man/as_incidence_matrix.Rd +++ b/man/as_incidence_matrix.Rd @@ -17,4 +17,8 @@ Some authors refer to the bipartite adjacency matrix as the "bipartite incidence matrix". igraph 1.6.0 and later does not use this naming to avoid confusion with the edge-vertex incidence matrix. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_get_biadjacency}{\code{get_biadjacency()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/as_long_data_frame.Rd b/man/as_long_data_frame.Rd index 4e5e865dee..5261238724 100644 --- a/man/as_long_data_frame.Rd +++ b/man/as_long_data_frame.Rd @@ -22,6 +22,10 @@ The first two columns are always named \code{from} and \code{to} and they contain the numeric ids of the incident vertices. The rows are listed in the order of numeric vertex ids. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_( ring(10), diff --git a/man/assortativity.Rd b/man/assortativity.Rd index 038771a866..488db921c8 100644 --- a/man/assortativity.Rd +++ b/man/assortativity.Rd @@ -107,6 +107,10 @@ and calls \code{assortativity()}. Undirected graphs are effectively treated as directed ones with all-reciprocal edges. Thus, self-loops are taken into account twice in undirected graphs. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity}{\code{assortativity()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity_nominal}{\code{assortativity_nominal()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity_degree}{\code{assortativity_degree()}} +} + \examples{ # random network, close to zero @@ -126,5 +130,3 @@ M. E. J. Newman: Assortative mixing in networks, \emph{Phys. Rev. Lett.} 89, Gabor Csardi \email{csardi.gabor@gmail.com} } \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity}{\code{assortativity()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity_nominal}{\code{assortativity_nominal()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity_degree}{\code{assortativity_degree()}}.} - diff --git a/man/assortativity.degree.Rd b/man/assortativity.degree.Rd index 2329687900..d2af62d22b 100644 --- a/man/assortativity.degree.Rd +++ b/man/assortativity.degree.Rd @@ -23,4 +23,8 @@ graphs.} \code{assortativity.degree()} was renamed to \code{\link[=assortativity_degree]{assortativity_degree()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity_degree}{\code{assortativity_degree()}} +} + \keyword{internal} diff --git a/man/assortativity.nominal.Rd b/man/assortativity.nominal.Rd index 08db8faf43..82e6c43716 100644 --- a/man/assortativity.nominal.Rd +++ b/man/assortativity.nominal.Rd @@ -32,4 +32,8 @@ values at the two ends of edges.} \code{assortativity.nominal()} was renamed to \code{\link[=assortativity_nominal]{assortativity_nominal()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity_nominal}{\code{assortativity_nominal()}} +} + \keyword{internal} diff --git a/man/asymmetric.preference.game.Rd b/man/asymmetric.preference.game.Rd index 552a09a1e1..3ff67ee529 100644 --- a/man/asymmetric.preference.game.Rd +++ b/man/asymmetric.preference.game.Rd @@ -32,4 +32,8 @@ an undirected graph, it must be symmetric.} \code{asymmetric.preference.game()} was renamed to \code{\link[=sample_asym_pref]{sample_asym_pref()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_asymmetric_preference_game}{\code{asymmetric_preference_game()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/authority.score.Rd b/man/authority.score.Rd index 814d1a19f3..5f4e42cfa9 100644 --- a/man/authority.score.Rd +++ b/man/authority.score.Rd @@ -34,4 +34,8 @@ selected by the surfer.} \code{authority.score()} was renamed to \code{\link[=authority_score]{authority_score()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_hub_and_authority_scores}{\code{hub_and_authority_scores()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/autocurve.edges.Rd b/man/autocurve.edges.Rd index 58ebff2987..33245bb9bf 100644 --- a/man/autocurve.edges.Rd +++ b/man/autocurve.edges.Rd @@ -18,4 +18,8 @@ curvature between \code{-start} and \code{start}, spaced equally.} \code{autocurve.edges()} was renamed to \code{\link[=curve_multiple]{curve_multiple()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/automorphism_group.Rd b/man/automorphism_group.Rd index ab8b25f3ca..767f7a9e12 100644 --- a/man/automorphism_group.Rd +++ b/man/automorphism_group.Rd @@ -71,6 +71,10 @@ a graph using the BLISS algorithm. See also the BLISS homepage at generating set is not necessarily minimal, and it may depend on the splitting heuristics used by BLISS. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_automorphism_group}{\code{automorphism_group()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## A ring has n*2 automorphisms, and a possible generating set is one that @@ -98,5 +102,3 @@ Tamas Nepusz \email{ntamas@gmail.com} for this manual page. } \concept{graph automorphism} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_automorphism_group}{\code{automorphism_group()}}.} - diff --git a/man/automorphisms.Rd b/man/automorphisms.Rd index abd7aea071..1207b8eb11 100644 --- a/man/automorphisms.Rd +++ b/man/automorphisms.Rd @@ -43,4 +43,8 @@ first smallest maximally non-trivially connected non-singleton cell.} \code{automorphisms()} was renamed to \code{\link[=count_automorphisms]{count_automorphisms()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_count_automorphisms}{\code{count_automorphisms()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/average.path.length.Rd b/man/average.path.length.Rd index cb3e0bb2ee..2814cb8da1 100644 --- a/man/average.path.length.Rd +++ b/man/average.path.length.Rd @@ -41,4 +41,8 @@ the result when this parameter is set to \code{TRUE}.} \code{average.path.length()} was renamed to \code{\link[=mean_distance]{mean_distance()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_average_path_length_dijkstra}{\code{average_path_length_dijkstra()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/ba.game.Rd b/man/ba.game.Rd index bcd3f83ee7..5b928effea 100644 --- a/man/ba.game.Rd +++ b/man/ba.game.Rd @@ -70,4 +70,8 @@ contain the out degrees of the new vertices only, not the ones in the \code{ba.game()} was renamed to \code{\link[=sample_pa]{sample_pa()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/barabasi.game.Rd b/man/barabasi.game.Rd index 142526d7d7..fd38ca860e 100644 --- a/man/barabasi.game.Rd +++ b/man/barabasi.game.Rd @@ -70,4 +70,8 @@ contain the out degrees of the new vertices only, not the ones in the \code{barabasi.game()} was renamed to \code{\link[=sample_pa]{sample_pa()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/betweenness.Rd b/man/betweenness.Rd index 085d04c523..b8db175158 100644 --- a/man/betweenness.Rd +++ b/man/betweenness.Rd @@ -96,6 +96,10 @@ Brandes (see References) is used. \code{edge_betweenness()} might give false values for graphs with multiple edges. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_betweenness_cutoff}{\code{betweenness_cutoff()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_edge_betweenness_cutoff}{\code{edge_betweenness_cutoff()}} +} + \examples{ g <- sample_gnp(10, 3 / 10) diff --git a/man/bfs.Rd b/man/bfs.Rd index d72f3f7603..da2eeaf397 100644 --- a/man/bfs.Rd +++ b/man/bfs.Rd @@ -138,6 +138,10 @@ The callback must return \code{FALSE} to continue the search or \code{TRUE} to terminate it. See examples below on how to use the callback function. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## Two rings diff --git a/man/biconnected.components.Rd b/man/biconnected.components.Rd index 33d3d69c88..a3e36ee144 100644 --- a/man/biconnected.components.Rd +++ b/man/biconnected.components.Rd @@ -16,4 +16,8 @@ it is directed.} \code{biconnected.components()} was renamed to \code{\link[=biconnected_components]{biconnected_components()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_biconnected_components}{\code{biconnected_components()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/biconnected_components.Rd b/man/biconnected_components.Rd index 370bf5ad07..f9b7e07914 100644 --- a/man/biconnected_components.Rd +++ b/man/biconnected_components.Rd @@ -45,6 +45,10 @@ edges: every edge is a member of exactly one biconnected component. Note that this is not true for vertices: the same vertex can be part of many biconnected components. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_biconnected_components}{\code{biconnected_components()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- disjoint_union(make_full_graph(5), make_full_graph(5)) @@ -68,5 +72,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{components} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_biconnected_components}{\code{biconnected_components()}}.} - diff --git a/man/bipartite.mapping.Rd b/man/bipartite.mapping.Rd index 7eb0c1a517..a2f17f24b2 100644 --- a/man/bipartite.mapping.Rd +++ b/man/bipartite.mapping.Rd @@ -15,4 +15,8 @@ bipartite.mapping(graph) \code{bipartite.mapping()} was renamed to \code{\link[=bipartite_mapping]{bipartite_mapping()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_is_bipartite}{\code{is_bipartite()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/bipartite.projection.Rd b/man/bipartite.projection.Rd index bf9ab6f0de..eeca4f08e2 100644 --- a/man/bipartite.projection.Rd +++ b/man/bipartite.projection.Rd @@ -48,4 +48,8 @@ default it will be removed.} \code{bipartite.projection()} was renamed to \code{\link[=bipartite_projection]{bipartite_projection()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/bipartite.projection.size.Rd b/man/bipartite.projection.size.Rd index 8e3335dd8b..22c998f424 100644 --- a/man/bipartite.projection.size.Rd +++ b/man/bipartite.projection.size.Rd @@ -20,4 +20,8 @@ graph has no \sQuote{\code{type}} vertex attribute.} \code{bipartite.projection.size()} was renamed to \code{\link[=bipartite_projection_size]{bipartite_projection_size()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_projection_size}{\code{bipartite_projection_size()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/bipartite.random.game.Rd b/man/bipartite.random.game.Rd index 5568114c2a..28bd051ed2 100644 --- a/man/bipartite.random.game.Rd +++ b/man/bipartite.random.game.Rd @@ -45,4 +45,8 @@ is ignored for undirected graphs.} \code{bipartite.random.game()} was renamed to \code{\link[=sample_bipartite]{sample_bipartite()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_game_gnm}{\code{bipartite_game_gnm()}}, \href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_game_gnp}{\code{bipartite_game_gnp()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/bipartite_mapping.Rd b/man/bipartite_mapping.Rd index 70bf01f2cd..ac55436f14 100644 --- a/man/bipartite_mapping.Rd +++ b/man/bipartite_mapping.Rd @@ -41,6 +41,10 @@ Note that the mapping is not necessarily unique, e.g. if the graph has at least two components, then the vertices in the separate components can be mapped independently. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_is_bipartite}{\code{is_bipartite()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## Rings with an even number of vertices are bipartite @@ -67,5 +71,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{bipartite} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_is_bipartite}{\code{is_bipartite()}}.} - diff --git a/man/bipartite_projection.Rd b/man/bipartite_projection.Rd index 7dbc2a65cc..52392a5303 100644 --- a/man/bipartite_projection.Rd +++ b/man/bipartite_projection.Rd @@ -68,6 +68,10 @@ the second. \code{bipartite_projection()} keeps vertex attributes. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_projection_size}{\code{bipartite_projection_size()}} +} + \examples{ ## Projection of a full bipartite graph is a full graph @@ -100,5 +104,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{bipartite} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_projection_size}{\code{bipartite_projection_size()}}.} - diff --git a/man/bonpow.Rd b/man/bonpow.Rd index 4377272047..16e3d87016 100644 --- a/man/bonpow.Rd +++ b/man/bonpow.Rd @@ -43,4 +43,8 @@ support} \code{bonpow()} was renamed to \code{\link[=power_centrality]{power_centrality()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_degree}{\code{degree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/canonical.permutation.Rd b/man/canonical.permutation.Rd index 88a07204e0..806f45fa79 100644 --- a/man/canonical.permutation.Rd +++ b/man/canonical.permutation.Rd @@ -29,4 +29,8 @@ for possible values.} \code{canonical.permutation()} was renamed to \code{\link[=canonical_permutation]{canonical_permutation()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_canonical_permutation}{\code{canonical_permutation()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/canonical_permutation.Rd b/man/canonical_permutation.Rd index a63a39afa6..79d38d2cd4 100644 --- a/man/canonical_permutation.Rd +++ b/man/canonical_permutation.Rd @@ -93,6 +93,10 @@ Smallest maximally non-trivially connected non-singleton cell. See the paper in references for details about these. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_canonical_permutation}{\code{canonical_permutation()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## Calculate the canonical form of a random graph @@ -139,5 +143,3 @@ Tommi Junttila for BLISS, Gabor Csardi } \concept{graph isomorphism} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_canonical_permutation}{\code{canonical_permutation()}}.} - diff --git a/man/centr_betw.Rd b/man/centr_betw.Rd index c66cdf59a0..c5cc9928e7 100644 --- a/man/centr_betw.Rd +++ b/man/centr_betw.Rd @@ -36,6 +36,10 @@ then the result was divided by this number. \description{ See \code{\link[=centralize]{centralize()}} for a summary of graph centralization. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_betweenness}{\code{centralization_betweenness()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) diff --git a/man/centr_betw_tmax.Rd b/man/centr_betw_tmax.Rd index 8341178531..4e42e086e6 100644 --- a/man/centr_betw_tmax.Rd +++ b/man/centr_betw_tmax.Rd @@ -25,6 +25,10 @@ parameters. \description{ See \code{\link[=centralize]{centralize()}} for a summary of graph centralization. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_betweenness_tmax}{\code{centralization_betweenness_tmax()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) @@ -44,5 +48,3 @@ Other centralization related: \code{\link{centralize}()} } \concept{centralization related} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_betweenness_tmax}{\code{centralization_betweenness_tmax()}}.} - diff --git a/man/centr_clo.Rd b/man/centr_clo.Rd index ab4dff83cc..dc08fa8eaf 100644 --- a/man/centr_clo.Rd +++ b/man/centr_clo.Rd @@ -36,6 +36,10 @@ then the result was divided by this number. \description{ See \code{\link[=centralize]{centralize()}} for a summary of graph centralization. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_closeness}{\code{centralization_closeness()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) @@ -56,5 +60,3 @@ Other centralization related: \code{\link{centralize}()} } \concept{centralization related} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_closeness}{\code{centralization_closeness()}}.} - diff --git a/man/centr_clo_tmax.Rd b/man/centr_clo_tmax.Rd index 91abfd3e69..c12fed0d53 100644 --- a/man/centr_clo_tmax.Rd +++ b/man/centr_clo_tmax.Rd @@ -24,6 +24,10 @@ parameters. \description{ See \code{\link[=centralize]{centralize()}} for a summary of graph centralization. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_closeness_tmax}{\code{centralization_closeness_tmax()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) @@ -43,5 +47,3 @@ Other centralization related: \code{\link{centralize}()} } \concept{centralization related} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_closeness_tmax}{\code{centralization_closeness_tmax()}}.} - diff --git a/man/centr_degree.Rd b/man/centr_degree.Rd index f6ddd71145..09d13d5a88 100644 --- a/man/centr_degree.Rd +++ b/man/centr_degree.Rd @@ -44,6 +44,10 @@ then the result was divided by this number. \description{ See \code{\link[=centralize]{centralize()}} for a summary of graph centralization. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_degree}{\code{centralization_degree()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) @@ -64,5 +68,3 @@ Other centralization related: \code{\link{centralize}()} } \concept{centralization related} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_degree}{\code{centralization_degree()}}.} - diff --git a/man/centr_degree_tmax.Rd b/man/centr_degree_tmax.Rd index edb6153307..14405f62b6 100644 --- a/man/centr_degree_tmax.Rd +++ b/man/centr_degree_tmax.Rd @@ -29,6 +29,10 @@ centrality score for graphs with given order and other parameters. \description{ See \code{\link[=centralize]{centralize()}} for a summary of graph centralization. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_degree_tmax}{\code{centralization_degree_tmax()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) diff --git a/man/centr_eigen.Rd b/man/centr_eigen.Rd index e418e79271..7888547164 100644 --- a/man/centr_eigen.Rd +++ b/man/centr_eigen.Rd @@ -51,6 +51,10 @@ for a graph with the same number of vertices. \description{ See \code{\link[=centralize]{centralize()}} for a summary of graph centralization. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_eigenvector_centrality}{\code{centralization_eigenvector_centrality()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) @@ -77,5 +81,3 @@ Other centralization related: \code{\link{centralize}()} } \concept{centralization related} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_eigenvector_centrality}{\code{centralization_eigenvector_centrality()}}.} - diff --git a/man/centr_eigen_tmax.Rd b/man/centr_eigen_tmax.Rd index 143d51252d..5aeeb56b78 100644 --- a/man/centr_eigen_tmax.Rd +++ b/man/centr_eigen_tmax.Rd @@ -32,6 +32,10 @@ other parameters. \description{ See \code{\link[=centralize]{centralize()}} for a summary of graph centralization. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_eigenvector_centrality_tmax}{\code{centralization_eigenvector_centrality_tmax()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) @@ -51,5 +55,3 @@ Other centralization related: \code{\link{centralize}()} } \concept{centralization related} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_eigenvector_centrality_tmax}{\code{centralization_eigenvector_centrality_tmax()}}.} - diff --git a/man/centralization.betweenness.Rd b/man/centralization.betweenness.Rd index eb88b18f35..e757f70982 100644 --- a/man/centralization.betweenness.Rd +++ b/man/centralization.betweenness.Rd @@ -21,4 +21,8 @@ centrality score by dividing by the theoretical maximum.} \code{centralization.betweenness()} was renamed to \code{\link[=centr_betw]{centr_betw()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_betweenness}{\code{centralization_betweenness()}} +} + \keyword{internal} diff --git a/man/centralization.betweenness.tmax.Rd b/man/centralization.betweenness.tmax.Rd index 58da0f0319..6630adf9a5 100644 --- a/man/centralization.betweenness.tmax.Rd +++ b/man/centralization.betweenness.tmax.Rd @@ -23,4 +23,8 @@ given.} \code{centralization.betweenness.tmax()} was renamed to \code{\link[=centr_betw_tmax]{centr_betw_tmax()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_betweenness_tmax}{\code{centralization_betweenness_tmax()}} +} + \keyword{internal} diff --git a/man/centralization.closeness.Rd b/man/centralization.closeness.Rd index d37f704897..fa28cea6e9 100644 --- a/man/centralization.closeness.Rd +++ b/man/centralization.closeness.Rd @@ -25,4 +25,8 @@ centrality score by dividing by the theoretical maximum.} \code{centralization.closeness()} was renamed to \code{\link[=centr_clo]{centr_clo()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_closeness}{\code{centralization_closeness()}} +} + \keyword{internal} diff --git a/man/centralization.closeness.tmax.Rd b/man/centralization.closeness.tmax.Rd index f8399e84c6..80da447b8c 100644 --- a/man/centralization.closeness.tmax.Rd +++ b/man/centralization.closeness.tmax.Rd @@ -26,4 +26,8 @@ given.} \code{centralization.closeness.tmax()} was renamed to \code{\link[=centr_clo_tmax]{centr_clo_tmax()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_closeness_tmax}{\code{centralization_closeness_tmax()}} +} + \keyword{internal} diff --git a/man/centralization.degree.Rd b/man/centralization.degree.Rd index 6f6715dc4d..6683538709 100644 --- a/man/centralization.degree.Rd +++ b/man/centralization.degree.Rd @@ -29,4 +29,8 @@ centrality score by dividing by the theoretical maximum.} \code{centralization.degree()} was renamed to \code{\link[=centr_degree]{centr_degree()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_degree}{\code{centralization_degree()}} +} + \keyword{internal} diff --git a/man/centralization.degree.tmax.Rd b/man/centralization.degree.tmax.Rd index fa664f658f..72024ee13c 100644 --- a/man/centralization.degree.tmax.Rd +++ b/man/centralization.degree.tmax.Rd @@ -28,4 +28,8 @@ calculating the degree.} \code{centralization.degree.tmax()} was renamed to \code{\link[=centr_degree_tmax]{centr_degree_tmax()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_degree_tmax}{\code{centralization_degree_tmax()}} +} + \keyword{internal} diff --git a/man/centralization.evcent.Rd b/man/centralization.evcent.Rd index f5e794376c..ba8d7357c6 100644 --- a/man/centralization.evcent.Rd +++ b/man/centralization.evcent.Rd @@ -33,4 +33,8 @@ centrality score by dividing by the theoretical maximum.} \code{centralization.evcent()} was renamed to \code{\link[=centr_eigen]{centr_eigen()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_eigenvector_centrality}{\code{centralization_eigenvector_centrality()}} +} + \keyword{internal} diff --git a/man/centralization.evcent.tmax.Rd b/man/centralization.evcent.tmax.Rd index b6e6f8b94e..8c4dd482e9 100644 --- a/man/centralization.evcent.tmax.Rd +++ b/man/centralization.evcent.tmax.Rd @@ -30,4 +30,8 @@ eigenvector centralization requires normalized eigenvector centrality scores.} \code{centralization.evcent.tmax()} was renamed to \code{\link[=centr_eigen_tmax]{centr_eigen_tmax()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization_eigenvector_centrality_tmax}{\code{centralization_eigenvector_centrality_tmax()}} +} + \keyword{internal} diff --git a/man/centralize.Rd b/man/centralize.Rd index 134db123a5..6dbc35a524 100644 --- a/man/centralize.Rd +++ b/man/centralize.Rd @@ -47,6 +47,10 @@ with a single edge (and potentially many isolates). \code{centralize()} implements general centralization formula to calculate a graph-level score from vertex-level scores. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization}{\code{centralization()}} +} + \examples{ # A BA graph is quite centralized g <- sample_pa(1000, m = 4) @@ -84,5 +88,3 @@ Other centralization related: \code{\link{centr_eigen_tmax}()} } \concept{centralization related} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization}{\code{centralization()}}.} - diff --git a/man/centralize.scores.Rd b/man/centralize.scores.Rd index 4db99dde6a..64b0010452 100644 --- a/man/centralize.scores.Rd +++ b/man/centralize.scores.Rd @@ -23,4 +23,8 @@ centrality score by dividing by the supplied theoretical maximum.} \code{centralize.scores()} was renamed to \code{\link[=centralize]{centralize()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_centralization}{\code{centralization()}} +} + \keyword{internal} diff --git a/man/cited.type.game.Rd b/man/cited.type.game.Rd index 97671da197..755e779b8d 100644 --- a/man/cited.type.game.Rd +++ b/man/cited.type.game.Rd @@ -36,4 +36,8 @@ graph as a vertex attribute called \sQuote{\code{type}}.} \code{cited.type.game()} was renamed to \code{\link[=sample_cit_types]{sample_cit_types()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/citing.cited.type.game.Rd b/man/citing.cited.type.game.Rd index 71f467eede..e82536c993 100644 --- a/man/citing.cited.type.game.Rd +++ b/man/citing.cited.type.game.Rd @@ -36,4 +36,8 @@ graph as a vertex attribute called \sQuote{\code{type}}.} \code{citing.cited.type.game()} was renamed to \code{\link[=sample_cit_cit_types]{sample_cit_cit_types()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/clique.number.Rd b/man/clique.number.Rd index b09afd58b7..8fcf71d02d 100644 --- a/man/clique.number.Rd +++ b/man/clique.number.Rd @@ -15,4 +15,8 @@ clique.number(graph) \code{clique.number()} was renamed to \code{\link[=clique_num]{clique_num()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_clique_number}{\code{clique_number()}} +} + \keyword{internal} diff --git a/man/cliques.Rd b/man/cliques.Rd index fcf314fd78..a1151440eb 100644 --- a/man/cliques.Rd +++ b/man/cliques.Rd @@ -111,6 +111,10 @@ of clique sizes, between the given minimum and maximum clique size. \code{is_clique()} tests whether all pairs within a vertex set are connected. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_cliques}{\code{cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_cliques}{\code{largest_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_clique_number}{\code{clique_number()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_weighted_cliques}{\code{largest_weighted_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_weighted_clique_number}{\code{weighted_clique_number()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_clique_size_hist}{\code{clique_size_hist()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_maximal_cliques_hist}{\code{maximal_cliques_hist()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_is_clique}{\code{is_clique()}} +} + \examples{ # this usually contains cliques of size six @@ -143,5 +147,3 @@ Tamas Nepusz \email{ntamas@gmail.com} and Gabor Csardi } \concept{cliques} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_cliques}{\code{cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_cliques}{\code{largest_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_clique_number}{\code{clique_number()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_weighted_cliques}{\code{largest_weighted_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_weighted_clique_number}{\code{weighted_clique_number()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_maximal_cliques_hist}{\code{maximal_cliques_hist()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_clique_size_hist}{\code{clique_size_hist()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_is_clique}{\code{is_clique()}}.} - diff --git a/man/closeness.Rd b/man/closeness.Rd index dc860d003e..2c8e7bb9c9 100644 --- a/man/closeness.Rd +++ b/man/closeness.Rd @@ -66,6 +66,10 @@ Closeness centrality is meaningful only for connected graphs. In disconnected graphs, consider using the harmonic centrality with \code{\link[=harmonic_centrality]{harmonic_centrality()}} } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_closeness_cutoff}{\code{closeness_cutoff()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_ring(10) diff --git a/man/cluster.distribution.Rd b/man/cluster.distribution.Rd index 4732759264..7fd87f55c4 100644 --- a/man/cluster.distribution.Rd +++ b/man/cluster.distribution.Rd @@ -24,4 +24,8 @@ by the cluster sizes.} \code{cluster.distribution()} was renamed to \code{\link[=component_distribution]{component_distribution()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_connected_components}{\code{connected_components()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/cluster_edge_betweenness.Rd b/man/cluster_edge_betweenness.Rd index 53371b41d6..4fd2efedc8 100644 --- a/man/cluster_edge_betweenness.Rd +++ b/man/cluster_edge_betweenness.Rd @@ -82,6 +82,10 @@ the edge IDs in order of the edges' removal; \code{edge.betweenness} contains the betweenness of each of these at the time of their removal; and \code{bridges} contains the IDs of edges whose removal caused a split. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- sample_pa(100, m = 2, directed = FALSE) diff --git a/man/cluster_fast_greedy.Rd b/man/cluster_fast_greedy.Rd index 66a1a1343d..ffd73b8215 100644 --- a/man/cluster_fast_greedy.Rd +++ b/man/cluster_fast_greedy.Rd @@ -47,6 +47,10 @@ for finding community structure, see A Clauset, MEJ Newman, C Moore: Finding community structure in very large networks, http://www.arxiv.org/abs/cond-mat/0408187 for the details. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_full_graph(5) \%du\% make_full_graph(5) \%du\% make_full_graph(5) diff --git a/man/cluster_fluid_communities.Rd b/man/cluster_fluid_communities.Rd index f69b33329f..c3c1be0145 100644 --- a/man/cluster_fluid_communities.Rd +++ b/man/cluster_fluid_communities.Rd @@ -24,6 +24,10 @@ several fluids interacting in a non-homogeneous environment (the graph topology), expanding and contracting based on their interaction and density. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_fluid_communities}{\code{community_fluid_communities()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_graph("Zachary") comms <- cluster_fluid_communities(g, 2) diff --git a/man/cluster_infomap.Rd b/man/cluster_infomap.Rd index 44a3c6171d..9e83736b5a 100644 --- a/man/cluster_infomap.Rd +++ b/man/cluster_infomap.Rd @@ -46,6 +46,10 @@ be taken into account. \details{ Please see the details of this method in the references given below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_infomap}{\code{community_infomap()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## Zachary's karate club diff --git a/man/cluster_label_prop.Rd b/man/cluster_label_prop.Rd index 86ec14c870..d781cc9d4d 100644 --- a/man/cluster_label_prop.Rd +++ b/man/cluster_label_prop.Rd @@ -68,6 +68,10 @@ that most of its neighbors currently have. In this iterative process densely connected groups of nodes form a consensus on a unique label to form communities.} } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_label_propagation}{\code{community_label_propagation()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- sample_gnp(10, 5 / 10) \%du\% sample_gnp(9, 5 / 9) diff --git a/man/cluster_leading_eigen.Rd b/man/cluster_leading_eigen.Rd index 96d4a19676..798cd9cfd0 100644 --- a/man/cluster_leading_eigen.Rd +++ b/man/cluster_leading_eigen.Rd @@ -123,6 +123,10 @@ The callback function should return a scalar number. If this number is non-zero, then the clustering is terminated. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_full_graph(5) \%du\% make_full_graph(5) \%du\% make_full_graph(5) diff --git a/man/cluster_leiden.Rd b/man/cluster_leiden.Rd index cbf925dcdd..bdca44d421 100644 --- a/man/cluster_leiden.Rd +++ b/man/cluster_leiden.Rd @@ -105,6 +105,10 @@ specify any \code{vertex_weights}, the correct vertex weights and scaling of \eqn{\gamma}{gamma} is determined automatically by the \code{objective_function} argument. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_leiden}{\code{community_leiden()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_strength}{\code{strength()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_graph("Zachary") # By default CPM is used diff --git a/man/cluster_louvain.Rd b/man/cluster_louvain.Rd index 46af930e5d..c155183f1c 100644 --- a/man/cluster_louvain.Rd +++ b/man/cluster_louvain.Rd @@ -50,6 +50,10 @@ vertices are processed in a random order. This function was contributed by Tom Gregorovic. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_multilevel}{\code{community_multilevel()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # This is so simple that we will have only one level diff --git a/man/cluster_optimal.Rd b/man/cluster_optimal.Rd index 9104059950..355fc08c67 100644 --- a/man/cluster_optimal.Rd +++ b/man/cluster_optimal.Rd @@ -62,6 +62,10 @@ print(modularity(fc)) } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_optimal_modularity}{\code{community_optimal_modularity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \references{ Ulrik Brandes, Daniel Delling, Marco Gaertler, Robert Gorke, Martin Hoefer, Zoran Nikoloski, Dorothea Wagner: On Modularity Clustering, diff --git a/man/cluster_spinglass.Rd b/man/cluster_spinglass.Rd index d031c79a3f..1776c582b0 100644 --- a/man/cluster_spinglass.Rd +++ b/man/cluster_spinglass.Rd @@ -132,6 +132,10 @@ If the \code{vertex} argument is given and it is not \code{NULL}, then it must be a vertex id, and the same energy function is used to find the community of the the given vertex. See also the examples below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- sample_gnp(10, 5 / 10) \%du\% sample_gnp(9, 5 / 9) diff --git a/man/cluster_walktrap.Rd b/man/cluster_walktrap.Rd index 076b3223ae..059036b110 100644 --- a/man/cluster_walktrap.Rd +++ b/man/cluster_walktrap.Rd @@ -52,6 +52,10 @@ This function is the implementation of the Walktrap community finding algorithm, see Pascal Pons, Matthieu Latapy: Computing communities in large networks using random walks, https://arxiv.org/abs/physics/0512106 } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_full_graph(5) \%du\% make_full_graph(5) \%du\% make_full_graph(5) diff --git a/man/clusters.Rd b/man/clusters.Rd index 1105d119b5..47bf6e5792 100644 --- a/man/clusters.Rd +++ b/man/clusters.Rd @@ -19,4 +19,8 @@ connected components to search. It is ignored for undirected graphs.} \code{clusters()} was renamed to \code{\link[=components]{components()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_connected_components}{\code{connected_components()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/cocitation.Rd b/man/cocitation.Rd index 8a6e5f8826..e5aed3b8f2 100644 --- a/man/cocitation.Rd +++ b/man/cocitation.Rd @@ -38,6 +38,10 @@ Calculating the cocitation or bibliographic coupling for only one vertex costs the same amount of computation as for all vertices. This might change in the future. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_cocitation}{\code{cocitation()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_bibcoupling}{\code{bibcoupling()}} +} + \examples{ g <- make_kautz_graph(2, 3) diff --git a/man/cohesive.blocks.Rd b/man/cohesive.blocks.Rd index 83cbd9e125..ba2a210ed5 100644 --- a/man/cohesive.blocks.Rd +++ b/man/cohesive.blocks.Rd @@ -25,4 +25,8 @@ cohesive blocks.} \code{cohesive.blocks()} was renamed to \code{\link[=cohesive_blocks]{cohesive_blocks()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_cohesive_blocks}{\code{cohesive_blocks()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/cohesive_blocks.Rd b/man/cohesive_blocks.Rd index 3b3993c100..94c426d3de 100644 --- a/man/cohesive_blocks.Rd +++ b/man/cohesive_blocks.Rd @@ -226,6 +226,10 @@ and the vertices are shown in groups of ten. The generic function \code{\link[=plot]{plot()}} plots the graph, showing one or more cohesive blocks in it. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_cohesive_blocks}{\code{cohesive_blocks()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_edgelist}{\code{write_graph_edgelist()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_pajek}{\code{write_graph_pajek()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_graphml}{\code{write_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_gml}{\code{write_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_dot}{\code{write_graph_dot()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_leda}{\code{write_graph_leda()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}} +} + \examples{ ## The graph from the Moody-White paper diff --git a/man/communities.Rd b/man/communities.Rd index 513f2a81d0..f0457fec03 100644 --- a/man/communities.Rd +++ b/man/communities.Rd @@ -238,6 +238,10 @@ corresponding to the communities. It passes additional arguments to \code{\link[=plot.igraph]{plot.igraph()}}, please see that and also \link{igraph.plotting} on how to change the plot. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ karate <- make_graph("Zachary") diff --git a/man/compare.Rd b/man/compare.Rd index afbcd72668..9a13eb1beb 100644 --- a/man/compare.Rd +++ b/man/compare.Rd @@ -36,6 +36,10 @@ A real number. \description{ This function assesses the distance between two community structures. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_compare_communities}{\code{compare_communities()}} +} + \examples{ g <- make_graph("Zachary") diff --git a/man/component_wise.Rd b/man/component_wise.Rd index 03e3c287fb..7449f9d11c 100644 --- a/man/component_wise.Rd +++ b/man/component_wise.Rd @@ -15,6 +15,10 @@ This is a layout modifier function, and it can be used to calculate the layout separately for each component of the graph. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) + make_ring(10) g \%>\% diff --git a/man/components.Rd b/man/components.Rd index 43f5430d97..7f7cdd1378 100644 --- a/man/components.Rd +++ b/man/components.Rd @@ -84,6 +84,10 @@ The weakly connected components are found by a simple breadth-first search. The strongly connected components are implemented by two consecutive depth-first searches. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_connected_components}{\code{connected_components()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_induced_subgraph}{\code{induced_subgraph()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_connected}{\code{is_connected()}} +} + \examples{ g <- sample_gnp(20, 1 / 20) @@ -133,5 +137,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} \concept{components} \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_connected}{\code{is_connected()}}.} - diff --git a/man/compose.Rd b/man/compose.Rd index bcefd04e21..8e4dc033d1 100644 --- a/man/compose.Rd +++ b/man/compose.Rd @@ -61,6 +61,10 @@ The function may create loop edges, if edges (a,b) and (b,a) are present in g1 and g2, respectively, then (a,a) is included in the result. See \code{\link[=simplify]{simplify()}} if you want to get rid of the self-loops. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g1 <- make_ring(10) diff --git a/man/consensus_tree.Rd b/man/consensus_tree.Rd index 7025d691b6..6276bf2a67 100644 --- a/man/consensus_tree.Rd +++ b/man/consensus_tree.Rd @@ -46,6 +46,10 @@ argument is given and \code{start} is set to \code{TRUE}, then it starts sampling from the given HRG. Otherwise it optimizes the HRG log-likelihood first, and then samples starting from the optimum. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_consensus}{\code{hrg_consensus()}} +} + \seealso{ Other hierarchical random graph functions: \code{\link{fit_hrg}()}, @@ -58,5 +62,3 @@ Other hierarchical random graph functions: \code{\link{sample_hrg}()} } \concept{hierarchical random graph functions} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_consensus}{\code{hrg_consensus()}}.} - diff --git a/man/constraint.Rd b/man/constraint.Rd index ae337644aa..36e7d76a2f 100644 --- a/man/constraint.Rd +++ b/man/constraint.Rd @@ -41,6 +41,10 @@ proportional tie strengths are defined as \eqn{a_{ij}}{a[i,j]} are elements of \eqn{A} and the latter being the graph adjacency matrix. For isolated vertices, constraint is undefined. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_constraint}{\code{constraint()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- sample_gnp(20, 5 / 20) diff --git a/man/contract.Rd b/man/contract.Rd index 5f2c561b46..c42d213e03 100644 --- a/man/contract.Rd +++ b/man/contract.Rd @@ -28,6 +28,10 @@ The attributes of the graph are kept. Graph and edge attributes are unchanged, vertex attributes are combined, according to the \code{vertex.attr.comb} parameter. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_contract_vertices}{\code{contract_vertices()}} +} + \examples{ g <- make_ring(10) @@ -76,5 +80,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{functions for manipulating graph structure} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_contract_vertices}{\code{contract_vertices()}}.} - diff --git a/man/contract.vertices.Rd b/man/contract.vertices.Rd index ebf7f683aa..39b96454a9 100644 --- a/man/contract.vertices.Rd +++ b/man/contract.vertices.Rd @@ -26,4 +26,8 @@ the new graph. Please see \code{\link[=attribute.combination]{attribute.combinat \code{contract.vertices()} was renamed to \code{\link[=contract]{contract()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_contract_vertices}{\code{contract_vertices()}} +} + \keyword{internal} diff --git a/man/convex_hull.Rd b/man/convex_hull.Rd index b500ab2615..918ea66e05 100644 --- a/man/convex_hull.Rd +++ b/man/convex_hull.Rd @@ -45,5 +45,3 @@ Tamas Nepusz \email{ntamas@gmail.com} } \concept{other} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Nongraph.html#igraph_convex_hull}{\code{convex_hull()}}.} - diff --git a/man/coreness.Rd b/man/coreness.Rd index c77603f336..7036638931 100644 --- a/man/coreness.Rd +++ b/man/coreness.Rd @@ -30,6 +30,10 @@ subgraph of the k-core. This function calculates the coreness for each vertex. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_coreness}{\code{coreness()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) diff --git a/man/count.multiple.Rd b/man/count.multiple.Rd index d219ce32b3..3c41db1609 100644 --- a/man/count.multiple.Rd +++ b/man/count.multiple.Rd @@ -18,4 +18,8 @@ all edges in the graph.} \code{count.multiple()} was renamed to \code{\link[=count_multiple]{count_multiple()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_count_multiple}{\code{count_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/count_automorphisms.Rd b/man/count_automorphisms.Rd index 6bcc661dea..8d7f25a9e5 100644 --- a/man/count_automorphisms.Rd +++ b/man/count_automorphisms.Rd @@ -75,6 +75,10 @@ BLISS algorithm. See also the BLISS homepage at automorphisms themselves, use \code{\link[=automorphism_group]{automorphism_group()}} to obtain a compact representation of the automorphism group. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_count_automorphisms}{\code{count_automorphisms()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## A ring has n*2 automorphisms, you can "turn" it by 0-9 vertices @@ -108,5 +112,3 @@ and this manual page. } \concept{graph automorphism} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_count_automorphisms}{\code{count_automorphisms()}}.} - diff --git a/man/count_isomorphisms.Rd b/man/count_isomorphisms.Rd index e449bb8253..cfc1b0ba7e 100644 --- a/man/count_isomorphisms.Rd +++ b/man/count_isomorphisms.Rd @@ -23,6 +23,10 @@ Number of isomorphic mappings between the two graphs. \description{ Count the number of isomorphic mappings between two graphs } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_count_isomorphisms_vf2}{\code{count_isomorphisms_vf2()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # colored graph isomorphism g1 <- make_ring(10) diff --git a/man/count_motifs.Rd b/man/count_motifs.Rd index 41317137ff..d30db66a59 100644 --- a/man/count_motifs.Rd +++ b/man/count_motifs.Rd @@ -27,6 +27,10 @@ structure. These functions search a graph for various motifs. \code{count_motifs()} calculates the total number of motifs of a given size in graph. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_motifs_randesu_no}{\code{motifs_randesu_no()}} +} + \examples{ g <- sample_pa(100) motifs(g, 3) diff --git a/man/count_reachable.Rd b/man/count_reachable.Rd index 249715c0c3..c6bd5eca89 100644 --- a/man/count_reachable.Rd +++ b/man/count_reachable.Rd @@ -34,6 +34,10 @@ A vertex is reachable from another if there is a directed path between them. For undirected graphs, two vertices are reachable from each other if they are in the same connected component. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_count_reachable}{\code{count_reachable()}} +} + \examples{ # In a directed path graph, the reachability depends on direction @@ -65,5 +69,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{components} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_count_reachable}{\code{count_reachable()}}.} - diff --git a/man/count_subgraph_isomorphisms.Rd b/man/count_subgraph_isomorphisms.Rd index 0ff33fc1ac..e66d2aa05d 100644 --- a/man/count_subgraph_isomorphisms.Rd +++ b/man/count_subgraph_isomorphisms.Rd @@ -71,6 +71,10 @@ If you want to ignore these attributes, then supply \code{NULL} for both of thes } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_count_subisomorphisms_vf2}{\code{count_subisomorphisms_vf2()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \references{ LP Cordella, P Foggia, C Sansone, and M Vento: An improved algorithm for matching large graphs, \emph{Proc. of the 3rd IAPR TC-15 Workshop diff --git a/man/count_triangles.Rd b/man/count_triangles.Rd index 8db87f9e93..5c2b5c008d 100644 --- a/man/count_triangles.Rd +++ b/man/count_triangles.Rd @@ -35,6 +35,10 @@ to the first triangle, etc. \code{count_triangles()} counts how many triangles a vertex is part of. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_list_triangles}{\code{list_triangles()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## A small graph @@ -63,5 +67,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{triangles} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_list_triangles}{\code{list_triangles()}}, \href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_adjacent_triangles}{\code{adjacent_triangles()}}.} - diff --git a/man/curve_multiple.Rd b/man/curve_multiple.Rd index 39bb02c9c8..17217d8db1 100644 --- a/man/curve_multiple.Rd +++ b/man/curve_multiple.Rd @@ -25,6 +25,10 @@ are visible. \code{curve_multiple()} calculates the optimal \code{edge.curved} vector for plotting a graph with multiple edges, so that all edges are visible. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_graph(c( diff --git a/man/degree.Rd b/man/degree.Rd index 2bd19522f8..2adbb5c95c 100644 --- a/man/degree.Rd +++ b/man/degree.Rd @@ -67,6 +67,10 @@ For graphs with no vertices, \code{NaN} is returned. The degree of a vertex is its most basic structural property, the number of its adjacent edges. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_degree}{\code{degree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_maxdegree}{\code{maxdegree()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_mean_degree}{\code{mean_degree()}} +} + \examples{ g <- make_ring(10) @@ -109,5 +113,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_maxdegree}{\code{maxdegree()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_mean_degree}{\code{mean_degree()}}.} - diff --git a/man/degree.distribution.Rd b/man/degree.distribution.Rd index 1a0fe90bcc..14595bdcc4 100644 --- a/man/degree.distribution.Rd +++ b/man/degree.distribution.Rd @@ -20,4 +20,8 @@ be calculated.} \code{degree.distribution()} was renamed to \code{\link[=degree_distribution]{degree_distribution()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_degree}{\code{degree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/delete.edges.Rd b/man/delete.edges.Rd index 760b9a84c0..804f327291 100644 --- a/man/delete.edges.Rd +++ b/man/delete.edges.Rd @@ -20,4 +20,8 @@ containing the IDs or names of the source and target vertices, separated by \code{delete.edges()} was renamed to \code{\link[=delete_edges]{delete_edges()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_delete_edges}{\code{delete_edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/delete.vertices.Rd b/man/delete.vertices.Rd index ab97018be6..63385c5f61 100644 --- a/man/delete.vertices.Rd +++ b/man/delete.vertices.Rd @@ -17,4 +17,8 @@ delete.vertices(graph, v) \code{delete.vertices()} was renamed to \code{\link[=delete_vertices]{delete_vertices()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_delete_vertices}{\code{delete_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/delete_edges.Rd b/man/delete_edges.Rd index 862be149fe..80d2152d84 100644 --- a/man/delete_edges.Rd +++ b/man/delete_edges.Rd @@ -20,6 +20,10 @@ The graph, with the edges removed. \description{ Delete edges from a graph } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_delete_edges}{\code{delete_edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) \%>\% delete_edges(seq(1, 9, by = 2)) diff --git a/man/delete_vertices.Rd b/man/delete_vertices.Rd index b21361a197..bf79d23a86 100644 --- a/man/delete_vertices.Rd +++ b/man/delete_vertices.Rd @@ -17,6 +17,10 @@ The graph, with the vertices removed. \description{ Delete vertices from a graph } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_delete_vertices}{\code{delete_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) \%>\% set_vertex_attr("name", value = LETTERS[1:10]) diff --git a/man/dfs.Rd b/man/dfs.Rd index 643c7031f0..9acc988721 100644 --- a/man/dfs.Rd +++ b/man/dfs.Rd @@ -118,6 +118,10 @@ The extra argument. } The callback must return FALSE to continue the search or TRUE to terminate it. See examples below on how to use the callback functions. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## A graph with two separate trees diff --git a/man/diameter.Rd b/man/diameter.Rd index 9fd3594546..6d9a5a569e 100644 --- a/man/diameter.Rd +++ b/man/diameter.Rd @@ -54,6 +54,10 @@ one found. \code{farthest_vertices()} returns two vertex ids, the vertices which are connected by the diameter path. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) diff --git a/man/difference.igraph.Rd b/man/difference.igraph.Rd index 129b86b4d5..8a6b0c1793 100644 --- a/man/difference.igraph.Rd +++ b/man/difference.igraph.Rd @@ -43,6 +43,10 @@ first graph. Note that \code{big} and \code{small} must both be directed or both be undirected, otherwise an error message is given. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}} +} + \examples{ ## Create a wheel graph diff --git a/man/dim_select.Rd b/man/dim_select.Rd index bbaa569d30..10e76cd5b2 100644 --- a/man/dim_select.Rd +++ b/man/dim_select.Rd @@ -33,6 +33,10 @@ assume that the left and the right of the vector are coming from two Normal distributions, with different means, and we want to know their border. See examples below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Embedding.html#igraph_dim_select}{\code{dim_select()}} +} + \examples{ # Generate the two groups of singular values with @@ -78,5 +82,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{embedding} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Embedding.html#igraph_dim_select}{\code{dim_select()}}.} - diff --git a/man/disjoint_union.Rd b/man/disjoint_union.Rd index ef4b90aa2e..1f602f2f34 100644 --- a/man/disjoint_union.Rd +++ b/man/disjoint_union.Rd @@ -42,6 +42,10 @@ result. A warning is given if this happens. An error is generated if some input graphs are directed and others are undirected. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## A star and a ring diff --git a/man/distances.Rd b/man/distances.Rd index 96ffa1c286..b04fb9b17d 100644 --- a/man/distances.Rd +++ b/man/distances.Rd @@ -247,6 +247,10 @@ path length between each pair of vertices. For directed graphs both directions are considered, so every pair of vertices appears twice in the histogram. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_path_length_hist}{\code{path_length_hist()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_average_path_length_dijkstra}{\code{average_path_length_dijkstra()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_all_shortest_paths}{\code{get_all_shortest_paths()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_all_shortest_paths_dijkstra}{\code{get_all_shortest_paths_dijkstra()}} +} + \examples{ g <- make_ring(10) @@ -328,5 +332,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} \concept{paths} \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_path_length_hist}{\code{path_length_hist()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_average_path_length_dijkstra}{\code{average_path_length_dijkstra()}}.} - diff --git a/man/diversity.Rd b/man/diversity.Rd index 570b68a7de..eea954f823 100644 --- a/man/diversity.Rd +++ b/man/diversity.Rd @@ -35,6 +35,10 @@ sum(w[i,l], l=1..k[i]),} and \eqn{k_i}{k[i]} is the (total) degree of vertex For vertices with degree less than two the function returns \code{NaN}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_diversity}{\code{diversity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g1 <- sample_gnp(20, 2 / 20) @@ -71,5 +75,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{centrality} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_diversity}{\code{diversity()}}.} - diff --git a/man/dominator.tree.Rd b/man/dominator.tree.Rd index 7e45489d3d..5f19cb448b 100644 --- a/man/dominator.tree.Rd +++ b/man/dominator.tree.Rd @@ -24,4 +24,8 @@ the original one in the input graph.} \code{dominator.tree()} was renamed to \code{\link[=dominator_tree]{dominator_tree()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_dominator_tree}{\code{dominator_tree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/dominator_tree.Rd b/man/dominator_tree.Rd index dfdb497e9a..fbfc083be7 100644 --- a/man/dominator_tree.Rd +++ b/man/dominator_tree.Rd @@ -55,6 +55,10 @@ ancestor of \eqn{w} in the dominator tree. This function implements the Lengauer-Tarjan algorithm to construct the dominator tree of a directed graph. For details see the reference below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_dominator_tree}{\code{dominator_tree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## The example from the paper diff --git a/man/dot-apply_modifiers.Rd b/man/dot-apply_modifiers.Rd index 0aa08bbb27..b8b9ddf266 100644 --- a/man/dot-apply_modifiers.Rd +++ b/man/dot-apply_modifiers.Rd @@ -18,4 +18,8 @@ The modified graph This is a helper function for the common parts of \code{make_()} and \code{sample_()}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/dyad.census.Rd b/man/dyad.census.Rd index 8ad215cf62..d814a489a5 100644 --- a/man/dyad.census.Rd +++ b/man/dyad.census.Rd @@ -15,4 +15,8 @@ dyad.census(graph) \code{dyad.census()} was renamed to \code{\link[=dyad_census]{dyad_census()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_dyad_census}{\code{dyad_census()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}} +} + \keyword{internal} diff --git a/man/dyad_census.Rd b/man/dyad_census.Rd index d6cb635b0d..3749c11ecb 100644 --- a/man/dyad_census.Rd +++ b/man/dyad_census.Rd @@ -28,6 +28,10 @@ Classify dyads in a directed graphs. The relationship between each pair of vertices is measured. It can be in three states: mutual, asymmetric or non-existent. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_dyad_census}{\code{dyad_census()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}} +} + \examples{ g <- sample_pa(100) @@ -56,5 +60,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{graph motifs} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_dyad_census}{\code{dyad_census()}}.} - diff --git a/man/eccentricity.Rd b/man/eccentricity.Rd index a4678a78d2..c8fa8c4bf8 100644 --- a/man/eccentricity.Rd +++ b/man/eccentricity.Rd @@ -48,6 +48,10 @@ and taking the maximum. This implementation ignores vertex pairs that are in different components. Isolate vertices have eccentricity zero. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_eccentricity_dijkstra}{\code{eccentricity_dijkstra()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_star(10, mode = "undirected") eccentricity(g) @@ -68,5 +72,3 @@ Other paths: \code{\link{radius}()} } \concept{paths} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_eccentricity_dijkstra}{\code{eccentricity_dijkstra()}}.} - diff --git a/man/edge.betweenness.Rd b/man/edge.betweenness.Rd index 8087a6c8c8..258838f417 100644 --- a/man/edge.betweenness.Rd +++ b/man/edge.betweenness.Rd @@ -34,4 +34,8 @@ betweenness. If negative, then there is no such limit.} \code{edge.betweenness()} was renamed to \code{\link[=edge_betweenness]{edge_betweenness()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_edge_betweenness_cutoff}{\code{edge_betweenness_cutoff()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/edge.betweenness.community.Rd b/man/edge.betweenness.community.Rd index bfeb5b97d5..734258183e 100644 --- a/man/edge.betweenness.community.Rd +++ b/man/edge.betweenness.community.Rd @@ -62,4 +62,8 @@ vector corresponding to the highest possible modularity score.} \code{edge.betweenness.community()} was renamed to \code{\link[=cluster_edge_betweenness]{cluster_edge_betweenness()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/edge.connectivity.Rd b/man/edge.connectivity.Rd index b7210bf2c5..8946cec238 100644 --- a/man/edge.connectivity.Rd +++ b/man/edge.connectivity.Rd @@ -29,4 +29,8 @@ thanks Peter.} \code{edge.connectivity()} was renamed to \code{\link[=edge_connectivity]{edge_connectivity()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_edge_connectivity}{\code{edge_connectivity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/edge.disjoint.paths.Rd b/man/edge.disjoint.paths.Rd index 0b5b8b9b21..6904bf0ef7 100644 --- a/man/edge.disjoint.paths.Rd +++ b/man/edge.disjoint.paths.Rd @@ -29,4 +29,8 @@ thanks Peter.} \code{edge.disjoint.paths()} was renamed to \code{\link[=edge_connectivity]{edge_connectivity()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_edge_connectivity}{\code{edge_connectivity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/edge_attr.Rd b/man/edge_attr.Rd index cb1c373a25..da3534f0e4 100644 --- a/man/edge_attr.Rd +++ b/man/edge_attr.Rd @@ -23,6 +23,10 @@ edge attributes if \code{name} is missing. \description{ Query edge attributes of a graph } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) \%>\% set_edge_attr("weight", value = 1:10) \%>\% diff --git a/man/edge_connectivity.Rd b/man/edge_connectivity.Rd index 914232a4be..193f28cf21 100644 --- a/man/edge_connectivity.Rd +++ b/man/edge_connectivity.Rd @@ -81,6 +81,10 @@ more precisely the most general is \code{edge_connectivity()}, the others are included only for having more descriptive function names. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_edge_connectivity}{\code{edge_connectivity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_adhesion}{\code{adhesion()}} +} + \examples{ g <- sample_pa(100, m = 1) diff --git a/man/edge_density.Rd b/man/edge_density.Rd index 99b4db0eb7..b00c0e4777 100644 --- a/man/edge_density.Rd +++ b/man/edge_density.Rd @@ -28,6 +28,10 @@ The concept of density is ill-defined for multigraphs. Note that this function does not check whether the graph has multi-edges and will return meaningless results for such graphs. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_density}{\code{density()}} +} + \examples{ edge_density(make_empty_graph(n = 10)) # empty graphs have density 0 @@ -80,5 +84,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_density}{\code{density()}}.} - diff --git a/man/ego.Rd b/man/ego.Rd index 66039cec73..79bae1c196 100644 --- a/man/ego.Rd +++ b/man/ego.Rd @@ -116,6 +116,10 @@ the vertex, edge and graph attributes. \code{connect()} creates a new graph by connecting each vertex to all other vertices in its neighborhood. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) diff --git a/man/eigen_centrality.Rd b/man/eigen_centrality.Rd index 43b3c7092c..72fa3a695f 100644 --- a/man/eigen_centrality.Rd +++ b/man/eigen_centrality.Rd @@ -96,6 +96,10 @@ whether the eigenvalue is very close to zero. From igraph version 0.5 this function uses ARPACK for the underlying computation, see \code{\link[=arpack]{arpack()}} for more about ARPACK in igraph. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_eigenvector_centrality}{\code{eigenvector_centrality()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # Generate some test data @@ -129,5 +133,3 @@ manual page. } \concept{centrality} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_eigenvector_centrality}{\code{eigenvector_centrality()}}.} - diff --git a/man/embed_adjacency_matrix.Rd b/man/embed_adjacency_matrix.Rd index 443e6489b9..9cccc6beca 100644 --- a/man/embed_adjacency_matrix.Rd +++ b/man/embed_adjacency_matrix.Rd @@ -88,6 +88,10 @@ For directed graphs the embedding is defined as the pair sqrt(D[no])}. (For undirected graphs \eqn{U=V}, so it is enough to keep one of them.) } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Embedding.html#igraph_adjacency_spectral_embedding}{\code{adjacency_spectral_embedding()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_strength}{\code{strength()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## A small graph @@ -112,5 +116,3 @@ Other embedding: } \concept{embedding} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Embedding.html#igraph_adjacency_spectral_embedding}{\code{adjacency_spectral_embedding()}}.} - diff --git a/man/embed_laplacian_matrix.Rd b/man/embed_laplacian_matrix.Rd index 21680f8247..511de02d6e 100644 --- a/man/embed_laplacian_matrix.Rd +++ b/man/embed_laplacian_matrix.Rd @@ -94,6 +94,10 @@ computed via the singular value decomposition of the Laplacian matrix. They are essentially doing the same as \code{\link[=embed_adjacency_matrix]{embed_adjacency_matrix()}}, but work on the Laplacian matrix, instead of the adjacency matrix. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Embedding.html#igraph_laplacian_spectral_embedding}{\code{laplacian_spectral_embedding()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## A small graph @@ -122,5 +126,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{embedding} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Embedding.html#igraph_laplacian_spectral_embedding}{\code{laplacian_spectral_embedding()}}.} - diff --git a/man/ends.Rd b/man/ends.Rd index 2274c14a7c..44d5584b42 100644 --- a/man/ends.Rd +++ b/man/ends.Rd @@ -21,6 +21,10 @@ A two column matrix of vertex names or vertex ids. \description{ Incident vertices of some graph edges } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(5) ends(g, E(g)) diff --git a/man/erdos.renyi.game.Rd b/man/erdos.renyi.game.Rd index caa0e0f924..26026aea59 100644 --- a/man/erdos.renyi.game.Rd +++ b/man/erdos.renyi.game.Rd @@ -40,6 +40,10 @@ Since igraph version 0.8.0, both \code{erdos.renyi.game()} and \code{random.graph.game()} is an (also deprecated) alias to this function. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_erdos_renyi_game_gnp}{\code{erdos_renyi_game_gnp()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_erdos_renyi_game_gnm}{\code{erdos_renyi_game_gnm()}} +} + \examples{ g <- erdos.renyi.game(1000, 1 / 1000) diff --git a/man/estimate_betweenness.Rd b/man/estimate_betweenness.Rd index dc7d8a49e9..3e0cc89c07 100644 --- a/man/estimate_betweenness.Rd +++ b/man/estimate_betweenness.Rd @@ -34,4 +34,8 @@ so they are interpreted as distances.} Use \code{\link[=betweenness]{betweenness()}} with the \code{cutoff} argument instead. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_betweenness_cutoff}{\code{betweenness_cutoff()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/estimate_closeness.Rd b/man/estimate_closeness.Rd index 0441327d3b..1fb6e927f4 100644 --- a/man/estimate_closeness.Rd +++ b/man/estimate_closeness.Rd @@ -42,4 +42,8 @@ all reachable vertices.} Use \code{\link[=closeness]{closeness()}} with the \code{cutoff} argument instead. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_closeness_cutoff}{\code{closeness_cutoff()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/estimate_edge_betweenness.Rd b/man/estimate_edge_betweenness.Rd index 976bdf6ac3..6a6bb65092 100644 --- a/man/estimate_edge_betweenness.Rd +++ b/man/estimate_edge_betweenness.Rd @@ -33,4 +33,8 @@ so they are interpreted as distances.} Use \code{\link[=edge_betweenness]{edge_betweenness()}} with the \code{cutoff} argument instead. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_edge_betweenness_cutoff}{\code{edge_betweenness_cutoff()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/evcent.Rd b/man/evcent.Rd index 5cb6f2e539..891916acf4 100644 --- a/man/evcent.Rd +++ b/man/evcent.Rd @@ -42,4 +42,8 @@ weights spread the centrality better.} \code{evcent()} was renamed to \code{\link[=eigen_centrality]{eigen_centrality()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_eigenvector_centrality}{\code{eigenvector_centrality()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/exportPajek.Rd b/man/exportPajek.Rd index e29f44bd35..ff7443302f 100644 --- a/man/exportPajek.Rd +++ b/man/exportPajek.Rd @@ -37,4 +37,8 @@ See details below.} \code{exportPajek()} was renamed to \code{\link[=export_pajek]{export_pajek()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_edgelist}{\code{write_graph_edgelist()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_pajek}{\code{write_graph_pajek()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_graphml}{\code{write_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_gml}{\code{write_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_dot}{\code{write_graph_dot()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_leda}{\code{write_graph_leda()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/farthest.nodes.Rd b/man/farthest.nodes.Rd index 33594b6af0..1be705989a 100644 --- a/man/farthest.nodes.Rd +++ b/man/farthest.nodes.Rd @@ -28,4 +28,8 @@ used by default.} \code{farthest.nodes()} was renamed to \code{\link[=farthest_vertices]{farthest_vertices()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/fastgreedy.community.Rd b/man/fastgreedy.community.Rd index 920f114a0e..9bf3cf43b5 100644 --- a/man/fastgreedy.community.Rd +++ b/man/fastgreedy.community.Rd @@ -39,4 +39,8 @@ edge weight means a stronger connection for this function.} \code{fastgreedy.community()} was renamed to \code{\link[=cluster_fast_greedy]{cluster_fast_greedy()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/feedback_arc_set.Rd b/man/feedback_arc_set.Rd index 59a41641f6..e8a754541e 100644 --- a/man/feedback_arc_set.Rd +++ b/man/feedback_arc_set.Rd @@ -38,6 +38,10 @@ directed acyclic graph (DAG). For undirected graphs, the removal of a feedback arc set ensures that the remaining graph is a forest (i.e. every connected component is a tree). } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_feedback_arc_set}{\code{feedback_arc_set()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_gnm(20, 40, directed = TRUE) @@ -88,5 +92,3 @@ Graph cycles \concept{cycles} \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_feedback_arc_set}{\code{feedback_arc_set()}}.} - diff --git a/man/feedback_vertex_set.Rd b/man/feedback_vertex_set.Rd index 06f635f7ee..324630f4fa 100644 --- a/man/feedback_vertex_set.Rd +++ b/man/feedback_vertex_set.Rd @@ -30,6 +30,10 @@ A feedback vertex set of a graph is a subset of vertices whose removal breaks all cycles in the graph. Finding a \emph{minimum} feedback vertex set is an NP-complete problem, both on directed and undirected graphs. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_feedback_vertex_set}{\code{feedback_vertex_set()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_lattice(c(3,3)) @@ -74,5 +78,3 @@ Graph cycles \concept{cycles} \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_feedback_vertex_set}{\code{feedback_vertex_set()}}.} - diff --git a/man/find_cycle.Rd b/man/find_cycle.Rd index 79d034fc85..d0ee84307a 100644 --- a/man/find_cycle.Rd +++ b/man/find_cycle.Rd @@ -28,6 +28,10 @@ sequences. Use \code{\link[=is_acyclic]{is_acyclic()}} to determine if a graph has cycles, without returning a specific cycle. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_find_cycle}{\code{find_cycle()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_lattice(c(3, 3)) @@ -49,5 +53,3 @@ Graph cycles } \concept{cycles} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_find_cycle}{\code{find_cycle()}}.} - diff --git a/man/fit_hrg.Rd b/man/fit_hrg.Rd index bf2d533f3e..491294a263 100644 --- a/man/fit_hrg.Rd +++ b/man/fit_hrg.Rd @@ -57,6 +57,10 @@ from a given HRG, if this is given in the \code{hrg()} argument and the \code{start} argument is \code{TRUE}. It can be converted to the \code{hclust} class using \code{as.hclust()} provided in this package. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_fit}{\code{hrg_fit()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ \dontshow{if (rlang::is_interactive()) withAutoprint(\{ # examplesIf} diff --git a/man/forest.fire.game.Rd b/man/forest.fire.game.Rd index 574211f1df..1f8c0b5c37 100644 --- a/man/forest.fire.game.Rd +++ b/man/forest.fire.game.Rd @@ -24,4 +24,8 @@ probability is calculated as \code{bw.factor*fw.prob}.} \code{forest.fire.game()} was renamed to \code{\link[=sample_forestfire]{sample_forestfire()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_forest_fire_game}{\code{forest_fire_game()}} +} + \keyword{internal} diff --git a/man/from_incidence_matrix.Rd b/man/from_incidence_matrix.Rd index 3db111359c..38ffe0812f 100644 --- a/man/from_incidence_matrix.Rd +++ b/man/from_incidence_matrix.Rd @@ -17,4 +17,8 @@ Some authors refer to the bipartite adjacency matrix as the "bipartite incidence matrix". igraph 1.6.0 and later does not use this naming to avoid confusion with the edge-vertex incidence matrix. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_biadjacency}{\code{biadjacency()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/get.adjacency.Rd b/man/get.adjacency.Rd index 4b4b3e0b66..94a483a9f6 100644 --- a/man/get.adjacency.Rd +++ b/man/get.adjacency.Rd @@ -52,4 +52,8 @@ matrices.} \code{get.adjacency()} was renamed to \code{\link[=as_adjacency_matrix]{as_adjacency_matrix()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/get.adjedgelist.Rd b/man/get.adjedgelist.Rd index 922825e654..3cd208493d 100644 --- a/man/get.adjedgelist.Rd +++ b/man/get.adjedgelist.Rd @@ -28,4 +28,8 @@ is not allowed for directed graphs and will be replaced with \code{"once"}.} \code{get.adjedgelist()} was renamed to \code{\link[=as_adj_edge_list]{as_adj_edge_list()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/get.adjlist.Rd b/man/get.adjlist.Rd index 46526385b1..82c73fccc9 100644 --- a/man/get.adjlist.Rd +++ b/man/get.adjlist.Rd @@ -32,4 +32,8 @@ of each set of parallel edges.} \code{get.adjlist()} was renamed to \code{\link[=as_adj_list]{as_adj_list()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/get.all.shortest.paths.Rd b/man/get.all.shortest.paths.Rd index 502d277d74..93181e54af 100644 --- a/man/get.all.shortest.paths.Rd +++ b/man/get.all.shortest.paths.Rd @@ -43,4 +43,8 @@ of a path is the sum of the weights of its constituent edges.} \code{get.all.shortest.paths()} was renamed to \code{\link[=all_shortest_paths]{all_shortest_paths()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_all_shortest_paths}{\code{get_all_shortest_paths()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_all_shortest_paths_dijkstra}{\code{get_all_shortest_paths_dijkstra()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/get.data.frame.Rd b/man/get.data.frame.Rd index 2985d73993..0ac6f8ff01 100644 --- a/man/get.data.frame.Rd +++ b/man/get.data.frame.Rd @@ -18,4 +18,8 @@ edges, or both. The default is \sQuote{edges}.} \code{get.data.frame()} was renamed to \code{\link[=as_data_frame]{as_data_frame()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/get.diameter.Rd b/man/get.diameter.Rd index d567873801..f7bbd7f93b 100644 --- a/man/get.diameter.Rd +++ b/man/get.diameter.Rd @@ -28,4 +28,8 @@ used by default.} \code{get.diameter()} was renamed to \code{\link[=get_diameter]{get_diameter()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/get.edge.attribute.Rd b/man/get.edge.attribute.Rd index 94c36d66ee..bc24ed9209 100644 --- a/man/get.edge.attribute.Rd +++ b/man/get.edge.attribute.Rd @@ -21,4 +21,8 @@ for a subset of edges.} \code{get.edge.attribute()} was renamed to \code{\link[=edge_attr]{edge_attr()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/get.edge.ids.Rd b/man/get.edge.ids.Rd index e83ef82509..4bfba2c96e 100644 --- a/man/get.edge.ids.Rd +++ b/man/get.edge.ids.Rd @@ -29,4 +29,8 @@ returned for the non-existant edge(s).} \code{get.edge.ids()} was renamed to \code{\link[=get_edge_ids]{get_edge_ids()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/get.edgelist.Rd b/man/get.edgelist.Rd index 60d2b6258b..dc066771ba 100644 --- a/man/get.edgelist.Rd +++ b/man/get.edgelist.Rd @@ -19,4 +19,8 @@ vertex ids.} \code{get.edgelist()} was renamed to \code{\link[=as_edgelist]{as_edgelist()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/get.incidence.Rd b/man/get.incidence.Rd index d197bdd45c..225de76f63 100644 --- a/man/get.incidence.Rd +++ b/man/get.incidence.Rd @@ -35,4 +35,8 @@ created, you will need the \code{Matrix} package for this.} \code{get.incidence()} was renamed to \code{\link[=as_biadjacency_matrix]{as_biadjacency_matrix()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_get_biadjacency}{\code{get_biadjacency()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/get.shortest.paths.Rd b/man/get.shortest.paths.Rd index f1c6516e4a..3436d20c81 100644 --- a/man/get.shortest.paths.Rd +++ b/man/get.shortest.paths.Rd @@ -79,4 +79,8 @@ used, regardless of this argument.} \code{get.shortest.paths()} was renamed to \code{\link[=shortest_paths]{shortest_paths()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}} +} + \keyword{internal} diff --git a/man/get.stochastic.Rd b/man/get.stochastic.Rd index cf4c94141a..3e6dc4a03d 100644 --- a/man/get.stochastic.Rd +++ b/man/get.stochastic.Rd @@ -25,4 +25,8 @@ sum up to one; otherwise it is the columns.} \code{get.stochastic()} was renamed to \code{\link[=stochastic_matrix]{stochastic_matrix()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_stochastic}{\code{get_stochastic()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_stochastic_sparse}{\code{get_stochastic_sparse()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/get.vertex.attribute.Rd b/man/get.vertex.attribute.Rd index 4fb9cd66eb..5eade77648 100644 --- a/man/get.vertex.attribute.Rd +++ b/man/get.vertex.attribute.Rd @@ -21,4 +21,8 @@ for these vertices.} \code{get.vertex.attribute()} was renamed to \code{\link[=vertex_attr]{vertex_attr()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/get_edge_ids.Rd b/man/get_edge_ids.Rd index f3cb5b74d8..cc243c3a21 100644 --- a/man/get_edge_ids.Rd +++ b/man/get_edge_ids.Rd @@ -39,6 +39,10 @@ the number of edges. This function allows finding the edges of the graph, via their incident vertices. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) diff --git a/man/girth.Rd b/man/girth.Rd index c95e85f018..a3aed74078 100644 --- a/man/girth.Rd +++ b/man/girth.Rd @@ -36,6 +36,10 @@ minimum circuit in a graph \emph{Proceedings of the ninth annual ACM symposium on Theory of computing}, 1-10, 1977. The first implementation of this function was done by Keith Briggs, thanks Keith. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ # No circle in a tree diff --git a/man/global_efficiency.Rd b/man/global_efficiency.Rd index c2bff5b8b6..da89ba35b2 100644 --- a/man/global_efficiency.Rd +++ b/man/global_efficiency.Rd @@ -89,6 +89,10 @@ the local efficiencies of all the vertices; see the definition for local efficiency above. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_global_efficiency}{\code{global_efficiency()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_efficiency}{\code{local_efficiency()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_average_local_efficiency}{\code{average_local_efficiency()}} +} + \examples{ g <- make_graph("zachary") @@ -104,5 +108,3 @@ transfer in regular and complex networks, Phys. Rev. E 71, 1 (2005). } \concept{efficiency} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_global_efficiency}{\code{global_efficiency()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_efficiency}{\code{local_efficiency()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_average_local_efficiency}{\code{average_local_efficiency()}}.} - diff --git a/man/gorder.Rd b/man/gorder.Rd index afe05c576a..1f1d4b40ac 100644 --- a/man/gorder.Rd +++ b/man/gorder.Rd @@ -18,6 +18,10 @@ Number of vertices, numeric scalar. \description{ \code{vcount()} and \code{gorder()} are aliases. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) gorder(g) @@ -40,5 +44,3 @@ Other structural queries: \code{\link{tail_of}()} } \concept{structural queries} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}.} - diff --git a/man/graph.Rd b/man/graph.Rd index 45201a87de..97eb679d29 100644 --- a/man/graph.Rd +++ b/man/graph.Rd @@ -58,4 +58,8 @@ Do not give both of them.} \code{graph()} was renamed to \code{\link[=make_graph]{make_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.adhesion.Rd b/man/graph.adhesion.Rd index 55d01dbab6..7162112708 100644 --- a/man/graph.adhesion.Rd +++ b/man/graph.adhesion.Rd @@ -23,4 +23,8 @@ thanks Peter.} \code{graph.adhesion()} was renamed to \code{\link[=adhesion]{adhesion()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_adhesion}{\code{adhesion()}} +} + \keyword{internal} diff --git a/man/graph.adjacency.Rd b/man/graph.adjacency.Rd index 3220fdb630..e31c0e9aed 100644 --- a/man/graph.adjacency.Rd +++ b/man/graph.adjacency.Rd @@ -54,4 +54,8 @@ former is ignored.} \code{graph.adjacency()} was renamed to \code{\link[=graph_from_adjacency_matrix]{graph_from_adjacency_matrix()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}} +} + \keyword{internal} diff --git a/man/graph.adjlist.Rd b/man/graph.adjlist.Rd index 75aa45a095..5e8d1e8abc 100644 --- a/man/graph.adjlist.Rd +++ b/man/graph.adjlist.Rd @@ -30,4 +30,8 @@ This argument is ignored if \code{mode} is \code{out} or \verb{in}.} \code{graph.adjlist()} was renamed to \code{\link[=graph_from_adj_list]{graph_from_adj_list()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_adjlist}{\code{adjlist()}} +} + \keyword{internal} diff --git a/man/graph.atlas.Rd b/man/graph.atlas.Rd index 630bc053d1..4d6f98548a 100644 --- a/man/graph.atlas.Rd +++ b/man/graph.atlas.Rd @@ -15,4 +15,8 @@ graph.atlas(n) \code{graph.atlas()} was renamed to \code{\link[=graph_from_atlas]{graph_from_atlas()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_atlas}{\code{atlas()}} +} + \keyword{internal} diff --git a/man/graph.automorphisms.Rd b/man/graph.automorphisms.Rd index 5a0b0980f4..5fed718024 100644 --- a/man/graph.automorphisms.Rd +++ b/man/graph.automorphisms.Rd @@ -43,4 +43,8 @@ first smallest maximally non-trivially connected non-singleton cell.} \code{graph.automorphisms()} was renamed to \code{\link[=count_automorphisms]{count_automorphisms()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_count_automorphisms}{\code{count_automorphisms()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.bfs.Rd b/man/graph.bfs.Rd index cb6d7d54b6..193e54c704 100644 --- a/man/graph.bfs.Rd +++ b/man/graph.bfs.Rd @@ -73,4 +73,8 @@ from igraph 1.3.0; use \code{mode} instead.} \code{graph.bfs()} was renamed to \code{\link[=bfs]{bfs()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.bipartite.Rd b/man/graph.bipartite.Rd index c4b17fbe22..fdcf650bbd 100644 --- a/man/graph.bipartite.Rd +++ b/man/graph.bipartite.Rd @@ -27,4 +27,8 @@ bipartite graphs.} \code{graph.bipartite()} was renamed to \code{\link[=make_bipartite_graph]{make_bipartite_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.compose.Rd b/man/graph.compose.Rd index 7523e3c898..d1b58052fd 100644 --- a/man/graph.compose.Rd +++ b/man/graph.compose.Rd @@ -23,4 +23,8 @@ but not both graphs are named.} \code{graph.compose()} was renamed to \code{\link[=compose]{compose()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph.coreness.Rd b/man/graph.coreness.Rd index f6cb0f5b4f..5e63e31b05 100644 --- a/man/graph.coreness.Rd +++ b/man/graph.coreness.Rd @@ -20,4 +20,8 @@ argument is ignored for undirected graphs.} \code{graph.coreness()} was renamed to \code{\link[=coreness]{coreness()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_coreness}{\code{coreness()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.data.frame.Rd b/man/graph.data.frame.Rd index 2ec0b6ca4a..dac33a5f8b 100644 --- a/man/graph.data.frame.Rd +++ b/man/graph.data.frame.Rd @@ -24,4 +24,8 @@ with \code{as.data.frame}, if not \code{NULL}.} \code{graph.data.frame()} was renamed to \code{\link[=graph_from_data_frame]{graph_from_data_frame()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_add_vertices}{\code{add_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph.de.bruijn.Rd b/man/graph.de.bruijn.Rd index 2cc74e9598..d13e54b3a3 100644 --- a/man/graph.de.bruijn.Rd +++ b/man/graph.de.bruijn.Rd @@ -17,4 +17,8 @@ graph.de.bruijn(m, n) \code{graph.de.bruijn()} was renamed to \code{\link[=make_de_bruijn_graph]{make_de_bruijn_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_de_bruijn}{\code{de_bruijn()}} +} + \keyword{internal} diff --git a/man/graph.density.Rd b/man/graph.density.Rd index a13d8df4d0..6e7633dbeb 100644 --- a/man/graph.density.Rd +++ b/man/graph.density.Rd @@ -20,4 +20,8 @@ the result will not be meaningful.} \code{graph.density()} was renamed to \code{\link[=edge_density]{edge_density()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_density}{\code{density()}} +} + \keyword{internal} diff --git a/man/graph.dfs.Rd b/man/graph.dfs.Rd index dd6833395f..0b7ce13b7a 100644 --- a/man/graph.dfs.Rd +++ b/man/graph.dfs.Rd @@ -66,4 +66,8 @@ algorithm. See details below.} \code{graph.dfs()} was renamed to \code{\link[=dfs]{dfs()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.disjoint.union.Rd b/man/graph.disjoint.union.Rd index b81cbea50f..0f3f71cddd 100644 --- a/man/graph.disjoint.union.Rd +++ b/man/graph.disjoint.union.Rd @@ -15,4 +15,8 @@ graph.disjoint.union(...) \code{graph.disjoint.union()} was renamed to \code{\link[=disjoint_union]{disjoint_union()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph.diversity.Rd b/man/graph.diversity.Rd index 02d7a817d6..1310df86fd 100644 --- a/man/graph.diversity.Rd +++ b/man/graph.diversity.Rd @@ -21,4 +21,8 @@ that this measure is not defined for unweighted graphs.} \code{graph.diversity()} was renamed to \code{\link[=diversity]{diversity()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_diversity}{\code{diversity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph.edgelist.Rd b/man/graph.edgelist.Rd index 289f8682de..7dd08d46c0 100644 --- a/man/graph.edgelist.Rd +++ b/man/graph.edgelist.Rd @@ -17,4 +17,8 @@ graph.edgelist(el, directed = TRUE) \code{graph.edgelist()} was renamed to \code{\link[=graph_from_edgelist]{graph_from_edgelist()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}} +} + \keyword{internal} diff --git a/man/graph.empty.Rd b/man/graph.empty.Rd index 3aa773805b..87a57eb8b2 100644 --- a/man/graph.empty.Rd +++ b/man/graph.empty.Rd @@ -17,4 +17,8 @@ graph.empty(n = 0, directed = TRUE) \code{graph.empty()} was renamed to \code{\link[=make_empty_graph]{make_empty_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}} +} + \keyword{internal} diff --git a/man/graph.extended.chordal.ring.Rd b/man/graph.extended.chordal.ring.Rd index 9166334f8a..a38be17a5e 100644 --- a/man/graph.extended.chordal.ring.Rd +++ b/man/graph.extended.chordal.ring.Rd @@ -20,4 +20,8 @@ details below.} \code{graph.extended.chordal.ring()} was renamed to \code{\link[=make_chordal_ring]{make_chordal_ring()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_extended_chordal_ring}{\code{extended_chordal_ring()}} +} + \keyword{internal} diff --git a/man/graph.famous.Rd b/man/graph.famous.Rd index d06866188e..41badfac62 100644 --- a/man/graph.famous.Rd +++ b/man/graph.famous.Rd @@ -58,4 +58,8 @@ Do not give both of them.} \code{graph.famous()} was renamed to \code{\link[=make_graph]{make_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.formula.Rd b/man/graph.formula.Rd index fcc871c91e..ef32f6cc78 100644 --- a/man/graph.formula.Rd +++ b/man/graph.formula.Rd @@ -21,4 +21,8 @@ multiple edges are removed.} \code{graph.formula()} was renamed to \code{\link[=graph_from_literal]{graph_from_literal()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}} +} + \keyword{internal} diff --git a/man/graph.full.bipartite.Rd b/man/graph.full.bipartite.Rd index 37346a98be..4ef7183c13 100644 --- a/man/graph.full.bipartite.Rd +++ b/man/graph.full.bipartite.Rd @@ -25,4 +25,8 @@ ignored for undirected graphs.x} \code{graph.full.bipartite()} was renamed to \code{\link[=make_full_bipartite_graph]{make_full_bipartite_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_full_bipartite}{\code{full_bipartite()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.full.citation.Rd b/man/graph.full.citation.Rd index 37b55e0745..f85b769487 100644 --- a/man/graph.full.citation.Rd +++ b/man/graph.full.citation.Rd @@ -17,4 +17,8 @@ graph.full.citation(n, directed = TRUE) \code{graph.full.citation()} was renamed to \code{\link[=make_full_citation_graph]{make_full_citation_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_full_citation}{\code{full_citation()}} +} + \keyword{internal} diff --git a/man/graph.graphdb.Rd b/man/graph.graphdb.Rd index c4b76001b5..338630a8b9 100644 --- a/man/graph.graphdb.Rd +++ b/man/graph.graphdb.Rd @@ -53,4 +53,8 @@ suffix is added to the filename.} \code{graph.graphdb()} was renamed to \code{\link[=graph_from_graphdb]{graph_from_graphdb()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphdb}{\code{read_graph_graphdb()}} +} + \keyword{internal} diff --git a/man/graph.incidence.Rd b/man/graph.incidence.Rd index 83db1f0009..5d4f6c3601 100644 --- a/man/graph.incidence.Rd +++ b/man/graph.incidence.Rd @@ -53,4 +53,8 @@ type) will be added.} \code{graph.incidence()} was renamed to \code{\link[=graph_from_biadjacency_matrix]{graph_from_biadjacency_matrix()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_biadjacency}{\code{biadjacency()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph.isocreate.Rd b/man/graph.isocreate.Rd index 7db881837d..4ab5ead35c 100644 --- a/man/graph.isocreate.Rd +++ b/man/graph.isocreate.Rd @@ -19,4 +19,8 @@ graph.isocreate(size, number, directed = TRUE) \code{graph.isocreate()} was renamed to \code{\link[=graph_from_isomorphism_class]{graph_from_isomorphism_class()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_isoclass_create}{\code{isoclass_create()}} +} + \keyword{internal} diff --git a/man/graph.kautz.Rd b/man/graph.kautz.Rd index dc3f41474f..c1e63d3590 100644 --- a/man/graph.kautz.Rd +++ b/man/graph.kautz.Rd @@ -17,4 +17,8 @@ graph.kautz(m, n) \code{graph.kautz()} was renamed to \code{\link[=make_kautz_graph]{make_kautz_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_kautz}{\code{kautz()}} +} + \keyword{internal} diff --git a/man/graph.knn.Rd b/man/graph.knn.Rd index 7b8202a3a6..82b2b86f91 100644 --- a/man/graph.knn.Rd +++ b/man/graph.knn.Rd @@ -42,4 +42,8 @@ Weights are are used to calculate a weighted degree (also called \code{graph.knn()} was renamed to \code{\link[=knn]{knn()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_avg_nearest_neighbor_degree}{\code{avg_nearest_neighbor_degree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph.laplacian.Rd b/man/graph.laplacian.Rd index d72126e7b0..93425fdbd4 100644 --- a/man/graph.laplacian.Rd +++ b/man/graph.laplacian.Rd @@ -31,4 +31,8 @@ matrix. The \code{Matrix} package is required for sparse matrices.} \code{graph.laplacian()} was renamed to \code{\link[=laplacian_matrix]{laplacian_matrix()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_laplacian}{\code{get_laplacian()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_laplacian_sparse}{\code{get_laplacian_sparse()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph.lattice.Rd b/man/graph.lattice.Rd index 58b4d735ff..7c46be9904 100644 --- a/man/graph.lattice.Rd +++ b/man/graph.lattice.Rd @@ -44,6 +44,8 @@ be extended to boolean vector with dimvector length.} \code{graph.lattice()} was renamed to \code{\link[=make_lattice]{make_lattice()}} to create a more consistent API. } -\keyword{internal} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_square_lattice}{\code{square_lattice()}}.} +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_square_lattice}{\code{square_lattice()}} +} +\keyword{internal} diff --git a/man/graph.lcf.Rd b/man/graph.lcf.Rd index fab95a327f..bfe9624424 100644 --- a/man/graph.lcf.Rd +++ b/man/graph.lcf.Rd @@ -20,4 +20,8 @@ it is set to \code{len(shifts) * repeats}.} \code{graph.lcf()} was renamed to \code{\link[=graph_from_lcf]{graph_from_lcf()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_lcf_vector}{\code{lcf_vector()}} +} + \keyword{internal} diff --git a/man/graph.maxflow.Rd b/man/graph.maxflow.Rd index a441a5a868..c155725f62 100644 --- a/man/graph.maxflow.Rd +++ b/man/graph.maxflow.Rd @@ -23,4 +23,8 @@ Note that the \code{weight} edge attribute is not used by this function.} \code{graph.maxflow()} was renamed to \code{\link[=max_flow]{max_flow()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_maxflow}{\code{maxflow()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.mincut.Rd b/man/graph.mincut.Rd index a2a6a43020..636b3a3cba 100644 --- a/man/graph.mincut.Rd +++ b/man/graph.mincut.Rd @@ -32,4 +32,8 @@ partitions are also returned.} \code{graph.mincut()} was renamed to \code{\link[=min_cut]{min_cut()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_mincut}{\code{mincut()}}, \href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_mincut_value}{\code{mincut_value()}}, \href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_st_mincut}{\code{st_mincut()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.motifs.Rd b/man/graph.motifs.Rd index 5d6ffcf8a2..a6a90bfe7c 100644 --- a/man/graph.motifs.Rd +++ b/man/graph.motifs.Rd @@ -23,4 +23,8 @@ If \verb{rep(0, size))}, the default, no cuts are made.} \code{graph.motifs()} was renamed to \code{\link[=motifs]{motifs()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_motifs_randesu}{\code{motifs_randesu()}} +} + \keyword{internal} diff --git a/man/graph.motifs.est.Rd b/man/graph.motifs.est.Rd index d2284e800c..5c390f62e7 100644 --- a/man/graph.motifs.est.Rd +++ b/man/graph.motifs.est.Rd @@ -36,4 +36,8 @@ starting point for finding motifs.} \code{graph.motifs.est()} was renamed to \code{\link[=sample_motifs]{sample_motifs()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_motifs_randesu_estimate}{\code{motifs_randesu_estimate()}} +} + \keyword{internal} diff --git a/man/graph.motifs.no.Rd b/man/graph.motifs.no.Rd index 801430b8fa..7e5cd498eb 100644 --- a/man/graph.motifs.no.Rd +++ b/man/graph.motifs.no.Rd @@ -22,4 +22,8 @@ If \code{NULL}, the default, no cuts are made.} \code{graph.motifs.no()} was renamed to \code{\link[=count_motifs]{count_motifs()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_motifs_randesu_no}{\code{motifs_randesu_no()}} +} + \keyword{internal} diff --git a/man/graph.neighborhood.Rd b/man/graph.neighborhood.Rd index 5e322a65d4..5c59bd25a7 100644 --- a/man/graph.neighborhood.Rd +++ b/man/graph.neighborhood.Rd @@ -36,4 +36,8 @@ argument is ignored for undirected graphs.} \code{graph.neighborhood()} was renamed to \code{\link[=make_ego_graph]{make_ego_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/graph.strength.Rd b/man/graph.strength.Rd index b0a556be30..1e6fa9e8cb 100644 --- a/man/graph.strength.Rd +++ b/man/graph.strength.Rd @@ -35,4 +35,8 @@ attribute, then this is used by default. If the graph does not have a \code{graph.strength()} was renamed to \code{\link[=strength]{strength()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_strength}{\code{strength()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph.union.Rd b/man/graph.union.Rd index 37dfa718af..15a12b310b 100644 --- a/man/graph.union.Rd +++ b/man/graph.union.Rd @@ -21,4 +21,8 @@ graphs are named.} \code{graph.union()} was renamed to \code{\link[=union.igraph]{union.igraph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph_.Rd b/man/graph_.Rd index 6a3756d18b..7f6d6505d9 100644 --- a/man/graph_.Rd +++ b/man/graph_.Rd @@ -15,6 +15,10 @@ This is a generic function to convert R objects to igraph graphs. \details{ TODO } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## These are equivalent graph_(cbind(1:5, 2:6), from_edgelist(directed = FALSE)) diff --git a/man/graph_center.Rd b/man/graph_center.Rd index edaa1075a6..f45c6cbf1b 100644 --- a/man/graph_center.Rd +++ b/man/graph_center.Rd @@ -32,6 +32,10 @@ The vertex IDs of the central vertices. The center of a graph is the set of its vertices with minimal eccentricity. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_graph_center_dijkstra}{\code{graph_center_dijkstra()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ tree <- make_tree(100, 7) graph_center(tree) @@ -57,5 +61,3 @@ Other paths: \code{\link{radius}()} } \concept{paths} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_graph_center_dijkstra}{\code{graph_center_dijkstra()}}.} - diff --git a/man/graph_from_adj_list.Rd b/man/graph_from_adj_list.Rd index f3881bdf42..3fc280eb0c 100644 --- a/man/graph_from_adj_list.Rd +++ b/man/graph_from_adj_list.Rd @@ -44,6 +44,10 @@ The idea is that you convert your graph to an adjacency list by \code{\link[=as_adj_list]{as_adj_list()}}, do your modifications to the graphs and finally create again an igraph graph by calling \code{graph_from_adj_list()}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_adjlist}{\code{adjlist()}} +} + \examples{ ## Directed @@ -82,5 +86,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{conversion} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_adjlist}{\code{adjlist()}}.} - diff --git a/man/graph_from_adjacency_matrix.Rd b/man/graph_from_adjacency_matrix.Rd index 80d48def26..44c9e51e6e 100644 --- a/man/graph_from_adjacency_matrix.Rd +++ b/man/graph_from_adjacency_matrix.Rd @@ -140,6 +140,10 @@ gives the edge weights. } } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}} +} + \examples{ g1 <- sample( diff --git a/man/graph_from_atlas.Rd b/man/graph_from_atlas.Rd index 6e38a69252..d623fc5aa2 100644 --- a/man/graph_from_atlas.Rd +++ b/man/graph_from_atlas.Rd @@ -31,6 +31,10 @@ the degree sequence, for example 111223 < 112222; automorphisms. } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_atlas}{\code{atlas()}} +} + \examples{ ## Some randomly picked graphs from the atlas graph_from_atlas(sample(0:1252, 1)) diff --git a/man/graph_from_biadjacency_matrix.Rd b/man/graph_from_biadjacency_matrix.Rd index 19b85d2739..aa148d5b57 100644 --- a/man/graph_from_biadjacency_matrix.Rd +++ b/man/graph_from_biadjacency_matrix.Rd @@ -71,6 +71,10 @@ Some authors refer to the bipartite adjacency matrix as the "bipartite incidence matrix". igraph 1.6.0 and later does not use this naming to avoid confusion with the edge-vertex incidence matrix. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_biadjacency}{\code{biadjacency()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ inc <- matrix(sample(0:1, 15, repl = TRUE), 3, 5) diff --git a/man/graph_from_data_frame.Rd b/man/graph_from_data_frame.Rd index 6aa7caeddb..c5b4f71830 100644 --- a/man/graph_from_data_frame.Rd +++ b/man/graph_from_data_frame.Rd @@ -94,6 +94,10 @@ replaced by the string \dQuote{NA}, but the rest of \sQuote{vertices} is not touched. In other words, vertex names (=the first column) cannot be \code{NA}, but other vertex attributes can. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_add_vertices}{\code{add_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## A simple example with a couple of actors diff --git a/man/graph_from_edgelist.Rd b/man/graph_from_edgelist.Rd index d9a783cbb0..ced866799c 100644 --- a/man/graph_from_edgelist.Rd +++ b/man/graph_from_edgelist.Rd @@ -27,6 +27,10 @@ it is a character matrix then it is interpreted as symbolic vertex names and a vertex id will be assigned to each name, and also a \code{name} vertex attribute will be added. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}} +} + \examples{ el <- matrix(c("foo", "bar", "bar", "foobar"), nc = 2, byrow = TRUE) graph_from_edgelist(el) diff --git a/man/graph_from_graphdb.Rd b/man/graph_from_graphdb.Rd index 689949b77c..19aaccca2e 100644 --- a/man/graph_from_graphdb.Rd +++ b/man/graph_from_graphdb.Rd @@ -71,6 +71,10 @@ its old version at \url{https://web.archive.org/web/20090215182331/http://amalfi.dis.unina.it/graph/db/doc/graphdbat.html} for the actual format of a graph database file and other information. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphdb}{\code{read_graph_graphdb()}} +} + \references{ M. De Santo, P. Foggia, C. Sansone, M. Vento: A large database of graphs and its use for benchmarking graph isomorphism algorithms, diff --git a/man/graph_from_graphnel.Rd b/man/graph_from_graphnel.Rd index ef7b6d0f1e..1a51f693f0 100644 --- a/man/graph_from_graphnel.Rd +++ b/man/graph_from_graphnel.Rd @@ -38,6 +38,10 @@ Because graphNEL graphs poorly support multiple edges, the edge attributes of the multiple edges are lost: they are all replaced by the attributes of the first of the multiple edges. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_adjlist}{\code{adjlist()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ \dontshow{if (rlang::is_installed("graph")) withAutoprint(\{ # examplesIf} ## Undirected diff --git a/man/graph_from_incidence_matrix.Rd b/man/graph_from_incidence_matrix.Rd index dd357fafaf..4837803098 100644 --- a/man/graph_from_incidence_matrix.Rd +++ b/man/graph_from_incidence_matrix.Rd @@ -17,4 +17,8 @@ Some authors refer to the bipartite adjacency matrix as the "bipartite incidence matrix". igraph 1.6.0 and later does not use this naming to avoid confusion with the edge-vertex incidence matrix. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_biadjacency}{\code{biadjacency()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graph_from_isomorphism_class.Rd b/man/graph_from_isomorphism_class.Rd index 0a74cf482b..633336af7d 100644 --- a/man/graph_from_isomorphism_class.Rd +++ b/man/graph_from_isomorphism_class.Rd @@ -24,6 +24,10 @@ class are isomorphic and isomorphic graphs always have the same isomorphism class. Currently it can handle directed graphs with 3 or 4 vertices and undirected graphd with 3 to 6 vertices. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_isoclass_create}{\code{isoclass_create()}} +} + \seealso{ Other graph isomorphism: \code{\link{canonical_permutation}()}, @@ -36,5 +40,3 @@ Other graph isomorphism: \code{\link{subgraph_isomorphisms}()} } \concept{graph isomorphism} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_isoclass_create}{\code{isoclass_create()}}.} - diff --git a/man/graph_from_lcf.Rd b/man/graph_from_lcf.Rd index 41ac2b6c9d..8f027f68b7 100644 --- a/man/graph_from_lcf.Rd +++ b/man/graph_from_lcf.Rd @@ -27,6 +27,10 @@ cycle backbone and another integer giving how many times the shifts should be performed. See \url{https://mathworld.wolfram.com/LCFNotation.html} for details. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_lcf_vector}{\code{lcf_vector()}} +} + \examples{ # This is the Franklin graph: @@ -42,5 +46,3 @@ functions on the its manual page for creating special graphs. Gabor Csardi \email{csardi.gabor@gmail.com} } \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_lcf_vector}{\code{lcf_vector()}}.} - diff --git a/man/graph_from_literal.Rd b/man/graph_from_literal.Rd index 71fa4350ac..ffb92a5029 100644 --- a/man/graph_from_literal.Rd +++ b/man/graph_from_literal.Rd @@ -91,6 +91,10 @@ You can include any character in the vertex names this way, even See more examples below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_famous}{\code{famous()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}} +} + \examples{ # A simple undirected graph g <- graph_from_literal( diff --git a/man/graphlet_basis.Rd b/man/graphlet_basis.Rd index 2a1a85e767..998c46a354 100644 --- a/man/graphlet_basis.Rd +++ b/man/graphlet_basis.Rd @@ -75,6 +75,10 @@ The second and third functions correspond to the first and second steps of the algorithm, and they are useful if the user wishes to perform them individually: \code{graphlet_basis()} and \code{graphlet_proj()}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Graphlets.html#igraph_graphlets_candidate_basis}{\code{graphlets_candidate_basis()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Graphlets.html#igraph_graphlets_project}{\code{graphlets_project()}}, \href{https://igraph.org/c/html/latest/igraph-Graphlets.html#igraph_graphlets}{\code{graphlets()}} +} + \examples{ ## Create an example graph first @@ -115,5 +119,3 @@ for (i in 1:length(gl$cliques)) { } } \concept{glet} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Graphlets.html#igraph_graphlets}{\code{graphlets()}}.} - diff --git a/man/graphlets.candidate.basis.Rd b/man/graphlets.candidate.basis.Rd index 917e3f93d7..e463edfaef 100644 --- a/man/graphlets.candidate.basis.Rd +++ b/man/graphlets.candidate.basis.Rd @@ -20,4 +20,8 @@ attribute is used.} \code{graphlets.candidate.basis()} was renamed to \code{\link[=graphlet_basis]{graphlet_basis()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Graphlets.html#igraph_graphlets_candidate_basis}{\code{graphlets_candidate_basis()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/graphlets.project.Rd b/man/graphlets.project.Rd index 2ad48efd98..fb756680be 100644 --- a/man/graphlets.project.Rd +++ b/man/graphlets.project.Rd @@ -33,4 +33,8 @@ projection.} \code{graphlets.project()} was renamed to \code{\link[=graphlet_proj]{graphlet_proj()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Graphlets.html#igraph_graphlets_project}{\code{graphlets_project()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/greedy_vertex_coloring.Rd b/man/greedy_vertex_coloring.Rd index 234169f164..fb6922d6f0 100644 --- a/man/greedy_vertex_coloring.Rd +++ b/man/greedy_vertex_coloring.Rd @@ -33,6 +33,10 @@ color that differs from that of already colored neighbors. The coloring obtained this way is not necessarily minimum but it can be calculated in linear time. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Coloring.html#igraph_vertex_coloring_greedy}{\code{vertex_coloring_greedy()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_graph("petersen") @@ -42,5 +46,3 @@ plot(g, vertex.color = col) } \concept{coloring} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Coloring.html#igraph_vertex_coloring_greedy}{\code{vertex_coloring_greedy()}}.} - diff --git a/man/grg.game.Rd b/man/grg.game.Rd index 4c430f572d..759063dffa 100644 --- a/man/grg.game.Rd +++ b/man/grg.game.Rd @@ -23,4 +23,8 @@ as vertex attributes called \sQuote{\code{x}} and \sQuote{\code{y}}.} \code{grg.game()} was renamed to \code{\link[=sample_grg]{sample_grg()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/growing.random.game.Rd b/man/growing.random.game.Rd index 0059c10d36..74e43c1037 100644 --- a/man/growing.random.game.Rd +++ b/man/growing.random.game.Rd @@ -22,4 +22,8 @@ each time step the added edges are originating from the new vertex.} \code{growing.random.game()} was renamed to \code{\link[=sample_growing]{sample_growing()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_growing_random_game}{\code{growing_random_game()}} +} + \keyword{internal} diff --git a/man/gsize.Rd b/man/gsize.Rd index 31d99ee4c1..3350734f49 100644 --- a/man/gsize.Rd +++ b/man/gsize.Rd @@ -18,6 +18,10 @@ Numeric scalar, the number of edges. \description{ \code{ecount()} and \code{gsize()} are aliases. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}} +} + \examples{ g <- sample_gnp(100, 2 / 100) gsize(g) diff --git a/man/handle_vertex_type_arg.Rd b/man/handle_vertex_type_arg.Rd index 194c91cbb6..4463ea481c 100644 --- a/man/handle_vertex_type_arg.Rd +++ b/man/handle_vertex_type_arg.Rd @@ -27,6 +27,10 @@ vertex attribute, then the value of this vertex attribute will be used as vertex types. Non-logical vertex type vectors are coerced into logical vectors after printing a warning. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \author{ Tamas Nepusz \email{ntamas@gmail.com} } diff --git a/man/harmonic_centrality.Rd b/man/harmonic_centrality.Rd index c70629c847..2b9fa010c3 100644 --- a/man/harmonic_centrality.Rd +++ b/man/harmonic_centrality.Rd @@ -52,6 +52,10 @@ of length \code{cutoff} or smaller only; this can be used for larger graphs to speed up the calculation. If \code{cutoff} is negative (which is the default), then the function calculates the exact harmonic centrality scores. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_harmonic_centrality_cutoff}{\code{harmonic_centrality_cutoff()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_ring(10) @@ -85,5 +89,3 @@ Centrality measures } \concept{centrality} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_harmonic_centrality_cutoff}{\code{harmonic_centrality_cutoff()}}.} - diff --git a/man/has.multiple.Rd b/man/has.multiple.Rd index 1c928b34ae..2d509df883 100644 --- a/man/has.multiple.Rd +++ b/man/has.multiple.Rd @@ -15,4 +15,8 @@ has.multiple(graph) \code{has.multiple()} was renamed to \code{\link[=any_multiple]{any_multiple()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_multiple}{\code{has_multiple()}} +} + \keyword{internal} diff --git a/man/has_eulerian_path.Rd b/man/has_eulerian_path.Rd index 1d7f56966e..c88c6b3a4c 100644 --- a/man/has_eulerian_path.Rd +++ b/man/has_eulerian_path.Rd @@ -51,6 +51,10 @@ once and that returns to its starting point, and returns a logical value as a result. \code{eulerian_cycle()} returns a possible Eulerian cycle, described with its edge and vertex sequence, or throws an error if no such cycle exists. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_is_eulerian}{\code{is_eulerian()}}, \href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_eulerian_path}{\code{eulerian_path()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_eulerian_cycle}{\code{eulerian_cycle()}} +} + \examples{ g <- make_graph(~ A - B - C - D - E - A - F - D - B - F - E) @@ -74,5 +78,3 @@ Graph cycles } \concept{cycles} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_is_eulerian}{\code{is_eulerian()}}, \href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_eulerian_path}{\code{eulerian_path()}}, \href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_eulerian_cycle}{\code{eulerian_cycle()}}.} - diff --git a/man/head_of.Rd b/man/head_of.Rd index adeda86f7f..172b53a30d 100644 --- a/man/head_of.Rd +++ b/man/head_of.Rd @@ -19,6 +19,10 @@ For undirected graphs, head and tail is not defined. In this case \code{head_of()} returns vertices incident to the supplied edges, and \code{tail_of()} returns the other end(s) of the edge(s). } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \seealso{ Other structural queries: \code{\link{[.igraph}()}, diff --git a/man/hits_scores.Rd b/man/hits_scores.Rd index ad304438ec..e073a0d261 100644 --- a/man/hits_scores.Rd +++ b/man/hits_scores.Rd @@ -60,6 +60,10 @@ the graph. For undirected matrices the adjacency matrix is symmetric and the hub scores are the same as authority scores. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_hub_and_authority_scores}{\code{hub_and_authority_scores()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## An in-star g <- make_star(10) @@ -95,5 +99,3 @@ Centrality measures \code{\link{subgraph_centrality}()} } \concept{centrality} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_hub_and_authority_scores}{\code{hub_and_authority_scores()}}.} - diff --git a/man/hrg.Rd b/man/hrg.Rd index 4eff251cef..691d818d24 100644 --- a/man/hrg.Rd +++ b/man/hrg.Rd @@ -21,6 +21,10 @@ a directed binary tree, with \eqn{n-1} internal and \eqn{n} leaf vertices. The \code{prob} argument contains the HRG probability labels for each vertex; these are ignored for leaf vertices. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_create}{\code{hrg_create()}} +} + \seealso{ Other hierarchical random graph functions: \code{\link{consensus_tree}()}, @@ -33,5 +37,3 @@ Other hierarchical random graph functions: \code{\link{sample_hrg}()} } \concept{hierarchical random graph functions} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_create}{\code{hrg_create()}}.} - diff --git a/man/hrg.consensus.Rd b/man/hrg.consensus.Rd index cffdc7dc09..b1fd895e19 100644 --- a/man/hrg.consensus.Rd +++ b/man/hrg.consensus.Rd @@ -26,4 +26,8 @@ missing edge prediction.} \code{hrg.consensus()} was renamed to \code{\link[=consensus_tree]{consensus_tree()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_consensus}{\code{hrg_consensus()}} +} + \keyword{internal} diff --git a/man/hrg.create.Rd b/man/hrg.create.Rd index c1e72dcdcf..e601e3d645 100644 --- a/man/hrg.create.Rd +++ b/man/hrg.create.Rd @@ -18,4 +18,8 @@ vertex ids.} \code{hrg.create()} was renamed to \code{\link[=hrg]{hrg()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_create}{\code{hrg_create()}} +} + \keyword{internal} diff --git a/man/hrg.dendrogram.Rd b/man/hrg.dendrogram.Rd index 9b544ba36c..30aef7a8c3 100644 --- a/man/hrg.dendrogram.Rd +++ b/man/hrg.dendrogram.Rd @@ -15,4 +15,8 @@ hrg.dendrogram(hrg) \code{hrg.dendrogram()} was renamed to \code{\link[=hrg_tree]{hrg_tree()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_from_hrg_dendrogram}{\code{from_hrg_dendrogram()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/hrg.fit.Rd b/man/hrg.fit.Rd index 7f931185fe..af6f375786 100644 --- a/man/hrg.fit.Rd +++ b/man/hrg.fit.Rd @@ -26,4 +26,8 @@ MCMC procedure is performed until convergence.} \code{hrg.fit()} was renamed to \code{\link[=fit_hrg]{fit_hrg()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_fit}{\code{hrg_fit()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/hrg.game.Rd b/man/hrg.game.Rd index 573826f3f8..58697a6980 100644 --- a/man/hrg.game.Rd +++ b/man/hrg.game.Rd @@ -15,4 +15,8 @@ hrg.game(hrg) \code{hrg.game()} was renamed to \code{\link[=sample_hrg]{sample_hrg()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_game}{\code{hrg_game()}} +} + \keyword{internal} diff --git a/man/hrg.predict.Rd b/man/hrg.predict.Rd index 015abe0a66..8030dbcb3e 100644 --- a/man/hrg.predict.Rd +++ b/man/hrg.predict.Rd @@ -36,4 +36,8 @@ number for a more accurate prediction.} \code{hrg.predict()} was renamed to \code{\link[=predict_edges]{predict_edges()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_predict}{\code{hrg_predict()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/hrg_tree.Rd b/man/hrg_tree.Rd index e3dcca5003..bc21a0017c 100644 --- a/man/hrg_tree.Rd +++ b/man/hrg_tree.Rd @@ -16,6 +16,10 @@ An igraph graph with a vertex attribute called \code{"probability"}. \code{hrg_tree()} creates the corresponsing igraph tree of a hierarchical random graph model. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_from_hrg_dendrogram}{\code{from_hrg_dendrogram()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \seealso{ Other hierarchical random graph functions: \code{\link{consensus_tree}()}, @@ -28,5 +32,3 @@ Other hierarchical random graph functions: \code{\link{sample_hrg}()} } \concept{hierarchical random graph functions} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_from_hrg_dendrogram}{\code{from_hrg_dendrogram()}}.} - diff --git a/man/hub.score.Rd b/man/hub.score.Rd index 64216c3c11..968b6dad25 100644 --- a/man/hub.score.Rd +++ b/man/hub.score.Rd @@ -29,4 +29,8 @@ selected by the surfer.} \code{hub.score()} was renamed to \code{\link[=hub_score]{hub_score()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_hub_and_authority_scores}{\code{hub_and_authority_scores()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/hub_score.Rd b/man/hub_score.Rd index cd80422d09..abc4eddf7f 100644 --- a/man/hub_score.Rd +++ b/man/hub_score.Rd @@ -36,6 +36,10 @@ Kleinberg's authority centrality scores. Kleinberg's hub centrality scores. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_hub_and_authority_scores}{\code{hub_and_authority_scores()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \seealso{ Centrality measures \code{\link{alpha_centrality}()}, diff --git a/man/igraph.from.graphNEL.Rd b/man/igraph.from.graphNEL.Rd index 451b91f241..60129e4543 100644 --- a/man/igraph.from.graphNEL.Rd +++ b/man/igraph.from.graphNEL.Rd @@ -27,4 +27,8 @@ whenever possible, before adding them to the igraph graph.} \code{igraph.from.graphNEL()} was renamed to \code{\link[=graph_from_graphnel]{graph_from_graphnel()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_adjlist}{\code{adjlist()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/igraph.to.graphNEL.Rd b/man/igraph.to.graphNEL.Rd index 80a31e9dc8..657ec0a10a 100644 --- a/man/igraph.to.graphNEL.Rd +++ b/man/igraph.to.graphNEL.Rd @@ -15,4 +15,8 @@ igraph.to.graphNEL(graph) \code{igraph.to.graphNEL()} was renamed to \code{\link[=as_graphnel]{as_graphnel()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_multiple}{\code{has_multiple()}} +} + \keyword{internal} diff --git a/man/igraph.version.Rd b/man/igraph.version.Rd index 0588348ab9..c63f3e1633 100644 --- a/man/igraph.version.Rd +++ b/man/igraph.version.Rd @@ -12,4 +12,8 @@ igraph.version() \code{igraph.version()} was renamed to \code{\link[=igraph_version]{igraph_version()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Nongraph.html#igraph_version}{\code{version()}} +} + \keyword{internal} diff --git a/man/igraph_version.Rd b/man/igraph_version.Rd index 07a9401d17..b2dae56f62 100644 --- a/man/igraph_version.Rd +++ b/man/igraph_version.Rd @@ -14,6 +14,10 @@ A character scalar, the igraph version string, with an attribute Returns the R package version, prints the R package version and C library version. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Nongraph.html#igraph_version}{\code{version()}} +} + \examples{ igraph_version() diff --git a/man/incident.Rd b/man/incident.Rd index b69fb6b753..b309d5a0b2 100644 --- a/man/incident.Rd +++ b/man/incident.Rd @@ -22,6 +22,10 @@ the input vertex. \description{ Incident edges of a vertex in a graph } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_incident}{\code{incident()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_graph("Zachary") incident(g, 1) diff --git a/man/incident_edges.Rd b/man/incident_edges.Rd index bbf46bfe2c..d46aa3c502 100644 --- a/man/incident_edges.Rd +++ b/man/incident_edges.Rd @@ -22,6 +22,10 @@ A list of edge sequences. This function is similar to \code{\link[=incident]{incident()}}, but it queries multiple vertices at once. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_graph("Zachary") incident_edges(g, c(1, 34)) diff --git a/man/independence.number.Rd b/man/independence.number.Rd index 1b58e94416..ac3aaccab0 100644 --- a/man/independence.number.Rd +++ b/man/independence.number.Rd @@ -15,4 +15,8 @@ independence.number(graph) \code{independence.number()} was renamed to \code{\link[=ivs_size]{ivs_size()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_independence_number}{\code{independence_number()}} +} + \keyword{internal} diff --git a/man/independent.vertex.sets.Rd b/man/independent.vertex.sets.Rd index 007cf945fb..7c6712b265 100644 --- a/man/independent.vertex.sets.Rd +++ b/man/independent.vertex.sets.Rd @@ -21,4 +21,8 @@ vertex sets to find. \code{NULL} means no limit.} \code{independent.vertex.sets()} was renamed to \code{\link[=ivs]{ivs()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/induced.subgraph.Rd b/man/induced.subgraph.Rd index bdd39ecd4e..a758bb971c 100644 --- a/man/induced.subgraph.Rd +++ b/man/induced.subgraph.Rd @@ -31,4 +31,8 @@ result graph.} \code{induced.subgraph()} was renamed to \code{\link[=induced_subgraph]{induced_subgraph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_induced_subgraph}{\code{induced_subgraph()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/infomap.community.Rd b/man/infomap.community.Rd index 6814f95b1c..841573d9cb 100644 --- a/man/infomap.community.Rd +++ b/man/infomap.community.Rd @@ -40,4 +40,8 @@ of the detected community structure.} \code{infomap.community()} was renamed to \code{\link[=cluster_infomap]{cluster_infomap()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_infomap}{\code{community_infomap()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/inside-square-error.Rd b/man/inside-square-error.Rd index 3e685fe3e8..997b90afc5 100644 --- a/man/inside-square-error.Rd +++ b/man/inside-square-error.Rd @@ -33,4 +33,8 @@ Functions to be used only with \verb{[.igraph.es} and \verb{[.igraph.vs} \details{ See \code{\link[igraph]{[.igraph.vs}} and \code{\link[igraph]{[.igraph.es}}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/interconnected.islands.game.Rd b/man/interconnected.islands.game.Rd index e7876315b3..c7fb2c7ffc 100644 --- a/man/interconnected.islands.game.Rd +++ b/man/interconnected.islands.game.Rd @@ -22,4 +22,8 @@ island.} \code{interconnected.islands.game()} was renamed to \code{\link[=sample_islands]{sample_islands()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_simple_interconnected_islands_game}{\code{simple_interconnected_islands_game()}} +} + \keyword{internal} diff --git a/man/intersection.igraph.Rd b/man/intersection.igraph.Rd index 5f87df0a31..5abc55c80b 100644 --- a/man/intersection.igraph.Rd +++ b/man/intersection.igraph.Rd @@ -47,6 +47,10 @@ present in all graphs, and it is not renamed in the result graph. An error is generated if some input graphs are directed and others are undirected. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## Common part of two social networks diff --git a/man/invalidate_cache.Rd b/man/invalidate_cache.Rd index d6aa035287..5162cd219c 100644 --- a/man/invalidate_cache.Rd +++ b/man/invalidate_cache.Rd @@ -26,6 +26,10 @@ invalid cache entry is when the result of a cached function (such as \code{\link{is_dag}()} or \code{\link{is_simple}()}) changes after calling this function. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_invalidate_cache}{\code{invalidate_cache()}} +} + \examples{ g <- make_ring(10) # Cache is populated when calling is_simple() diff --git a/man/is.connected.Rd b/man/is.connected.Rd index 41e307952a..c0a0ce458b 100644 --- a/man/is.connected.Rd +++ b/man/is.connected.Rd @@ -19,4 +19,8 @@ connected components to search. It is ignored for undirected graphs.} \code{is.connected()} was renamed to \code{\link[=is_connected]{is_connected()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_connected}{\code{is_connected()}} +} + \keyword{internal} diff --git a/man/is.dag.Rd b/man/is.dag.Rd index 5ebd55f8c4..2cd064019b 100644 --- a/man/is.dag.Rd +++ b/man/is.dag.Rd @@ -16,4 +16,8 @@ is.dag(graph) \code{is.dag()} was renamed to \code{\link[=is_dag]{is_dag()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_dag}{\code{is_dag()}} +} + \keyword{internal} diff --git a/man/is.degree.sequence.Rd b/man/is.degree.sequence.Rd index e382eaf150..90ddaea333 100644 --- a/man/is.degree.sequence.Rd +++ b/man/is.degree.sequence.Rd @@ -19,4 +19,8 @@ should be \code{NULL}. For directed graphs it specifies the in-degrees.} \code{is.degree.sequence()} was renamed to \code{\link[=is_degseq]{is_degseq()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_graphical}{\code{is_graphical()}} +} + \keyword{internal} diff --git a/man/is.directed.Rd b/man/is.directed.Rd index 800f842bff..22792554e2 100644 --- a/man/is.directed.Rd +++ b/man/is.directed.Rd @@ -15,4 +15,8 @@ is.directed(graph) \code{is.directed()} was renamed to \code{\link[=is_directed]{is_directed()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}} +} + \keyword{internal} diff --git a/man/is.graphical.degree.sequence.Rd b/man/is.graphical.degree.sequence.Rd index a17e74ebd0..2635ca8703 100644 --- a/man/is.graphical.degree.sequence.Rd +++ b/man/is.graphical.degree.sequence.Rd @@ -30,4 +30,8 @@ allowed.} \code{is.graphical.degree.sequence()} was renamed to \code{\link[=is_graphical]{is_graphical()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_graphical}{\code{is_graphical()}} +} + \keyword{internal} diff --git a/man/is.loop.Rd b/man/is.loop.Rd index 81f9d1d070..c63c097c8d 100644 --- a/man/is.loop.Rd +++ b/man/is.loop.Rd @@ -18,4 +18,8 @@ all edges in the graph.} \code{is.loop()} was renamed to \code{\link[=which_loop]{which_loop()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_loop}{\code{is_loop()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/is.matching.Rd b/man/is.matching.Rd index e034615d00..c32489be33 100644 --- a/man/is.matching.Rd +++ b/man/is.matching.Rd @@ -23,4 +23,8 @@ are taken from the \sQuote{\code{type}} vertex attribute, if present.} \code{is.matching()} was renamed to \code{\link[=is_matching]{is_matching()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_matching}{\code{is_matching()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/is.maximal.matching.Rd b/man/is.maximal.matching.Rd index f48288c578..7eceda30ed 100644 --- a/man/is.maximal.matching.Rd +++ b/man/is.maximal.matching.Rd @@ -23,4 +23,8 @@ are taken from the \sQuote{\code{type}} vertex attribute, if present.} \code{is.maximal.matching()} was renamed to \code{\link[=is_max_matching]{is_max_matching()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_maximal_matching}{\code{is_maximal_matching()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/is.minimal.separator.Rd b/man/is.minimal.separator.Rd index 3c86bfaaa7..34258079a2 100644 --- a/man/is.minimal.separator.Rd +++ b/man/is.minimal.separator.Rd @@ -19,4 +19,8 @@ separator.} \code{is.minimal.separator()} was renamed to \code{\link[=is_min_separator]{is_min_separator()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_is_minimal_separator}{\code{is_minimal_separator()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/is.multiple.Rd b/man/is.multiple.Rd index cc062a2582..17a101cae0 100644 --- a/man/is.multiple.Rd +++ b/man/is.multiple.Rd @@ -18,4 +18,8 @@ all edges in the graph.} \code{is.multiple()} was renamed to \code{\link[=which_multiple]{which_multiple()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_multiple}{\code{is_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/is.mutual.Rd b/man/is.mutual.Rd index 923bd67edf..32990db084 100644 --- a/man/is.mutual.Rd +++ b/man/is.mutual.Rd @@ -20,4 +20,8 @@ includes all edges in the order of their ids.} \code{is.mutual()} was renamed to \code{\link[=which_mutual]{which_mutual()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_mutual}{\code{is_mutual()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/is.separator.Rd b/man/is.separator.Rd index 08bb7b55a1..39518e933d 100644 --- a/man/is.separator.Rd +++ b/man/is.separator.Rd @@ -19,4 +19,8 @@ separator.} \code{is.separator()} was renamed to \code{\link[=is_separator]{is_separator()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_is_separator}{\code{is_separator()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/is.simple.Rd b/man/is.simple.Rd index 1629caa51d..5097fe7266 100644 --- a/man/is.simple.Rd +++ b/man/is.simple.Rd @@ -15,4 +15,8 @@ is.simple(graph) \code{is.simple()} was renamed to \code{\link[=is_simple]{is_simple()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_simple}{\code{is_simple()}} +} + \keyword{internal} diff --git a/man/is_acyclic.Rd b/man/is_acyclic.Rd index 21a8b7dc86..ed7d89a3df 100644 --- a/man/is_acyclic.Rd +++ b/man/is_acyclic.Rd @@ -19,6 +19,10 @@ This function tests whether the given graph is free of cycles. This function looks for directed cycles in directed graphs and undirected cycles in undirected graphs. Use \code{\link[=find_cycle]{find_cycle()}} to return a specific cycle. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_acyclic}{\code{is_acyclic()}} +} + \examples{ g <- make_graph(c(1, 2, 1, 3, 2, 4, 3, 4), directed = TRUE) @@ -67,5 +71,3 @@ Other structural.properties: \concept{cycles} \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_acyclic}{\code{is_acyclic()}}.} - diff --git a/man/is_biconnected.Rd b/man/is_biconnected.Rd index 68af404b60..8867c374f9 100644 --- a/man/is_biconnected.Rd +++ b/man/is_biconnected.Rd @@ -26,6 +26,10 @@ igraph does not consider single-vertex graphs biconnected. Note that some authors do not consider the graph consisting of two connected vertices as biconnected, however, igraph does. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_biconnected}{\code{is_biconnected()}} +} + \examples{ is_biconnected(make_graph("bull")) is_biconnected(make_graph("dodecahedron")) @@ -45,5 +49,3 @@ Connected components } \concept{components} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_biconnected}{\code{is_biconnected()}}.} - diff --git a/man/is_complete.Rd b/man/is_complete.Rd index 75e6e5c21c..1d595d932f 100644 --- a/man/is_complete.Rd +++ b/man/is_complete.Rd @@ -17,6 +17,10 @@ A graph is considered complete if there is an edge between all distinct directed pairs of vertices. igraph considers both the singleton graph and the null graph complete. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_is_complete}{\code{is_complete()}} +} + \examples{ g <- make_full_graph(6, directed = TRUE) @@ -36,5 +40,3 @@ Other cliques: } \concept{cliques} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_is_complete}{\code{is_complete()}}.} - diff --git a/man/is_dag.Rd b/man/is_dag.Rd index 0c651de7b3..ae542c9ed9 100644 --- a/man/is_dag.Rd +++ b/man/is_dag.Rd @@ -21,6 +21,10 @@ graph. \code{is_dag()} checks whether there is a directed cycle in the graph. If not, the graph is a DAG. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_dag}{\code{is_dag()}} +} + \examples{ g <- make_tree(10) @@ -71,5 +75,3 @@ Tamas Nepusz \email{ntamas@gmail.com} for the C code, Gabor Csardi \concept{cycles} \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_dag}{\code{is_dag()}}.} - diff --git a/man/is_degseq.Rd b/man/is_degseq.Rd index da1c352a91..3c98d2c951 100644 --- a/man/is_degseq.Rd +++ b/man/is_degseq.Rd @@ -25,6 +25,10 @@ For directed graphs, the function checks whether the lengths of the two degree vectors are equal and whether their sums are also equal. These are known sufficient and necessary conditions for a degree sequence to be valid. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_graphical}{\code{is_graphical()}} +} + \examples{ g <- sample_gnp(100, 2 / 100) is_degseq(degree(g)) diff --git a/man/is_directed.Rd b/man/is_directed.Rd index 73e2fce602..212924e1b5 100644 --- a/man/is_directed.Rd +++ b/man/is_directed.Rd @@ -15,6 +15,10 @@ Logical scalar, whether the graph is directed. \description{ Check whether a graph is directed } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}} +} + \examples{ g <- make_ring(10) is_directed(g) diff --git a/man/is_forest.Rd b/man/is_forest.Rd index 5cf4bd73af..b46015c509 100644 --- a/man/is_forest.Rd +++ b/man/is_forest.Rd @@ -44,6 +44,10 @@ controlled using the mode parameter. By convention, the null graph (i.e. the graph with no vertices) is considered to be a forest. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_forest}{\code{is_forest()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_tree(3) + make_tree(5, 3) @@ -60,5 +64,3 @@ Other trees: } \concept{trees} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_forest}{\code{is_forest()}}.} - diff --git a/man/is_graphical.Rd b/man/is_graphical.Rd index 6c10001c9b..20882fa8db 100644 --- a/man/is_graphical.Rd +++ b/man/is_graphical.Rd @@ -36,6 +36,10 @@ The classical concept of graphicality assumes simple graphs. This function can perform the check also when self-loops, multi-edges, or both are allowed in the graph. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_graphical}{\code{is_graphical()}} +} + \examples{ g <- sample_gnp(100, 2 / 100) is_degseq(degree(g)) @@ -58,5 +62,3 @@ Tamás Nepusz \email{ntamas@gmail.com} } \concept{graphical degree sequences} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_graphical}{\code{is_graphical()}}.} - diff --git a/man/is_min_separator.Rd b/man/is_min_separator.Rd index 69bc91bdcd..9bbf7f1c0f 100644 --- a/man/is_min_separator.Rd +++ b/man/is_min_separator.Rd @@ -25,6 +25,10 @@ Check whether a given set of vertices is a minimal vertex separator. vertex separator. A minimal vertex separator is a vertex separator, such that none of its proper subsets are a vertex separator. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_is_minimal_separator}{\code{is_minimal_separator()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ # The graph from the Moody-White paper mw <- graph_from_literal( @@ -69,5 +73,3 @@ Other flow: \code{\link{vertex_connectivity}()} } \concept{flow} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_is_minimal_separator}{\code{is_minimal_separator()}}.} - diff --git a/man/is_separator.Rd b/man/is_separator.Rd index 6906cf8fba..1a76bdd138 100644 --- a/man/is_separator.Rd +++ b/man/is_separator.Rd @@ -25,6 +25,10 @@ A vertex set \eqn{S} is a separator if there are vertices \eqn{u} and \eqn{v} in the graph such that all paths between \eqn{u} and \eqn{v} pass through some vertices in \eqn{S}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_is_separator}{\code{is_separator()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ring <- make_ring(4) min_st_separators(ring) @@ -48,5 +52,3 @@ Other flow: \code{\link{vertex_connectivity}()} } \concept{flow} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_is_separator}{\code{is_separator()}}.} - diff --git a/man/is_tree.Rd b/man/is_tree.Rd index ed1f0d1858..ea686f77a9 100644 --- a/man/is_tree.Rd +++ b/man/is_tree.Rd @@ -44,6 +44,10 @@ controlled using the mode parameter. By convention, the null graph (i.e. the graph with no vertices) is considered not to be a tree. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_tree}{\code{is_tree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_tree(7, 2) @@ -60,5 +64,3 @@ Other trees: } \concept{trees} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_tree}{\code{is_tree()}}.} - diff --git a/man/isomorphic.Rd b/man/isomorphic.Rd index 9432f4777d..623f65e400 100644 --- a/man/isomorphic.Rd +++ b/man/isomorphic.Rd @@ -93,6 +93,10 @@ Character constant, the heuristics to use in the BLISS algorithm for \code{graph \code{sh} defaults to \sQuote{fm}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_isomorphic}{\code{isomorphic()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_isomorphic_bliss}{\code{isomorphic_bliss()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_isomorphic_vf2}{\code{isomorphic_vf2()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # create some non-isomorphic graphs g1 <- graph_from_isomorphism_class(3, 10) diff --git a/man/isomorphism_class.Rd b/man/isomorphism_class.Rd index 5a485b06df..8d3255f41f 100644 --- a/man/isomorphism_class.Rd +++ b/man/isomorphism_class.Rd @@ -24,6 +24,10 @@ class are isomorphic and isomorphic graphs always have the same isomorphism class. Currently it can handle directed graphs with 3 or 4 vertices and undirected graphs with 3 to 6 vertices. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_isoclass_subgraph}{\code{isoclass_subgraph()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_isoclass}{\code{isoclass()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ # create some non-isomorphic graphs g1 <- graph_from_isomorphism_class(3, 10) diff --git a/man/isomorphisms.Rd b/man/isomorphisms.Rd index 95ffdf50ed..e8648732bf 100644 --- a/man/isomorphisms.Rd +++ b/man/isomorphisms.Rd @@ -24,6 +24,10 @@ mappings from the first graph to the second. \description{ Calculate all isomorphic mappings between the vertices of two graphs } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_get_isomorphisms_vf2}{\code{get_isomorphisms_vf2()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \seealso{ Other graph isomorphism: \code{\link{canonical_permutation}()}, diff --git a/man/ivs.Rd b/man/ivs.Rd index 0643adb051..785f64ca0e 100644 --- a/man/ivs.Rd +++ b/man/ivs.Rd @@ -72,6 +72,10 @@ reference below. \code{is_ivs()} tests if no pairs within a vertex set are connected. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_independent_vertex_sets}{\code{largest_independent_vertex_sets()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_maximal_independent_vertex_sets}{\code{maximal_independent_vertex_sets()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_independence_number}{\code{independence_number()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_is_independent_vertex_set}{\code{is_independent_vertex_set()}} +} + \examples{ # Do not run, takes a couple of seconds @@ -106,5 +110,3 @@ page. } \concept{cliques} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_is_independent_vertex_set}{\code{is_independent_vertex_set()}}.} - diff --git a/man/k.regular.game.Rd b/man/k.regular.game.Rd index 6dde63c85f..bbecb80207 100644 --- a/man/k.regular.game.Rd +++ b/man/k.regular.game.Rd @@ -23,4 +23,8 @@ out-degree and in-degree in a directed graph.} \code{k.regular.game()} was renamed to \code{\link[=sample_k_regular]{sample_k_regular()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_k_regular_game}{\code{k_regular_game()}} +} + \keyword{internal} diff --git a/man/k_shortest_paths.Rd b/man/k_shortest_paths.Rd index c136dc0097..4b68153308 100644 --- a/man/k_shortest_paths.Rd +++ b/man/k_shortest_paths.Rd @@ -55,6 +55,10 @@ Finds the \eqn{k} shortest paths between the given source and target vertex in order of increasing length. Currently this function uses Yen's algorithm. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_k_shortest_paths}{\code{get_k_shortest_paths()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \references{ Yen, Jin Y.: An algorithm for finding shortest routes from all source nodes to a given @@ -93,5 +97,3 @@ Other structural.properties: } \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_k_shortest_paths}{\code{get_k_shortest_paths()}}.} - diff --git a/man/knn.Rd b/man/knn.Rd index 13c35422f0..c1764413f5 100644 --- a/man/knn.Rd +++ b/man/knn.Rd @@ -67,6 +67,10 @@ The sum runs over the neighbors \code{v} of vertex \code{u} as indicated by \code{mode}. \eqn{w_{uv}}{w_uv} denotes the weighted adjacency matrix and \eqn{k_v}{k_v} is the neighbors' degree, specified by \code{neighbor_degree_mode}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_avg_nearest_neighbor_degree}{\code{avg_nearest_neighbor_degree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # Some trivial ones @@ -125,5 +129,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_avg_nearest_neighbor_degree}{\code{avg_nearest_neighbor_degree()}}.} - diff --git a/man/label.propagation.community.Rd b/man/label.propagation.community.Rd index 1f17fd8c98..2fdeeae6ac 100644 --- a/man/label.propagation.community.Rd +++ b/man/label.propagation.community.Rd @@ -50,4 +50,8 @@ will be ignored. Also note that vertices without labels cannot be fixed.} \code{label.propagation.community()} was renamed to \code{\link[=cluster_label_prop]{cluster_label_prop()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_label_propagation}{\code{community_label_propagation()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/laplacian_matrix.Rd b/man/laplacian_matrix.Rd index f21be5f5e7..db427eef86 100644 --- a/man/laplacian_matrix.Rd +++ b/man/laplacian_matrix.Rd @@ -65,6 +65,10 @@ The Laplacian matrix \eqn{L} is defined in terms of the adjacency matrix } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_laplacian}{\code{get_laplacian()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_laplacian_sparse}{\code{get_laplacian_sparse()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_ring(10) @@ -77,5 +81,3 @@ laplacian_matrix(g, normalization = "unnormalized", sparse = FALSE) Gabor Csardi \email{csardi.gabor@gmail.com} } \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_laplacian}{\code{get_laplacian()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_laplacian_sparse}{\code{get_laplacian_sparse()}}.} - diff --git a/man/largest.cliques.Rd b/man/largest.cliques.Rd index 66bc925bc2..a3329b93f3 100644 --- a/man/largest.cliques.Rd +++ b/man/largest.cliques.Rd @@ -15,4 +15,8 @@ largest.cliques(graph) \code{largest.cliques()} was renamed to \code{\link[=largest_cliques]{largest_cliques()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_cliques}{\code{largest_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/largest.independent.vertex.sets.Rd b/man/largest.independent.vertex.sets.Rd index 90baaf9022..8ac844a511 100644 --- a/man/largest.independent.vertex.sets.Rd +++ b/man/largest.independent.vertex.sets.Rd @@ -15,4 +15,8 @@ largest.independent.vertex.sets(graph) \code{largest.independent.vertex.sets()} was renamed to \code{\link[=largest_ivs]{largest_ivs()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_independent_vertex_sets}{\code{largest_independent_vertex_sets()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/layout.auto.Rd b/man/layout.auto.Rd index 918012af09..96f8aa9936 100644 --- a/man/layout.auto.Rd +++ b/man/layout.auto.Rd @@ -21,4 +21,8 @@ the real layout function. For \code{nicely()} all argument are passed to \code{layout.auto()} was renamed to \code{\link[=layout_nicely]{layout_nicely()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_forest}{\code{is_forest()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/layout.bipartite.Rd b/man/layout.bipartite.Rd index d4873e80f9..54495b490c 100644 --- a/man/layout.bipartite.Rd +++ b/man/layout.bipartite.Rd @@ -30,4 +30,8 @@ you have too many edge crossings, increase this.} \code{layout.bipartite()} was renamed to \code{\link[=layout_as_bipartite]{layout_as_bipartite()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_bipartite}{\code{layout_bipartite()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/layout.davidson.harel.Rd b/man/layout.davidson.harel.Rd index 693f209223..9acd5eea30 100644 --- a/man/layout.davidson.harel.Rd +++ b/man/layout.davidson.harel.Rd @@ -52,4 +52,8 @@ the energy function.} \code{layout.davidson.harel()} was renamed to \code{\link[=layout_with_dh]{layout_with_dh()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_davidson_harel}{\code{layout_davidson_harel()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_density}{\code{density()}} +} + \keyword{internal} diff --git a/man/layout.drl.Rd b/man/layout.drl.Rd index 8d95290403..7dd3b26ba5 100644 --- a/man/layout.drl.Rd +++ b/man/layout.drl.Rd @@ -44,4 +44,8 @@ significantly longer to compute.} \code{layout.drl()} was renamed to \code{\link[=layout_with_drl]{layout_with_drl()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/layout.fruchterman.reingold.grid.Rd b/man/layout.fruchterman.reingold.grid.Rd index 67368c0ed9..b6a6164632 100644 --- a/man/layout.fruchterman.reingold.grid.Rd +++ b/man/layout.fruchterman.reingold.grid.Rd @@ -19,4 +19,8 @@ Layout coordinates, a two column matrix. Now it calls the Fruchterman-Reingold layout \code{\link[=layout_with_fr]{layout_with_fr()}}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/layout.gem.Rd b/man/layout.gem.Rd index 78a3b23cb0..d33eb1333e 100644 --- a/man/layout.gem.Rd +++ b/man/layout.gem.Rd @@ -41,4 +41,8 @@ default is the square root of the number of vertices.} \code{layout.gem()} was renamed to \code{\link[=layout_with_gem]{layout_with_gem()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_gem}{\code{layout_gem()}} +} + \keyword{internal} diff --git a/man/layout.grid.Rd b/man/layout.grid.Rd index d022e74396..03a558ac32 100644 --- a/man/layout.grid.Rd +++ b/man/layout.grid.Rd @@ -26,4 +26,8 @@ determinted automatically.} \code{layout.grid()} was renamed to \code{\link[=layout_on_grid]{layout_on_grid()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_grid}{\code{layout_grid()}}, \href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_grid_3d}{\code{layout_grid_3d()}} +} + \keyword{internal} diff --git a/man/layout.mds.Rd b/man/layout.mds.Rd index 6514e3a1c4..b196220cb0 100644 --- a/man/layout.mds.Rd +++ b/man/layout.mds.Rd @@ -26,4 +26,8 @@ solving the eigenproblem} \code{layout.mds()} was renamed to \code{\link[=layout_with_mds]{layout_with_mds()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_mds}{\code{layout_mds()}} +} + \keyword{internal} diff --git a/man/layout.spring.Rd b/man/layout.spring.Rd index b87db5942d..5dca06a6a8 100644 --- a/man/layout.spring.Rd +++ b/man/layout.spring.Rd @@ -19,4 +19,8 @@ Layout coordinates, a two column matrix. Now it calls the Fruchterman-Reingold layout \code{\link[=layout_with_fr]{layout_with_fr()}}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/layout.star.Rd b/man/layout.star.Rd index 1e0fd4fbad..aa24b1ab45 100644 --- a/man/layout.star.Rd +++ b/man/layout.star.Rd @@ -21,4 +21,8 @@ The default ordering is given by the vertex ids.} \code{layout.star()} was renamed to \code{\link[=layout_as_star]{layout_as_star()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_star}{\code{layout_star()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_circle}{\code{layout_circle()}} +} + \keyword{internal} diff --git a/man/layout.sugiyama.Rd b/man/layout.sugiyama.Rd index 3a87fe3359..1c22d49bca 100644 --- a/man/layout.sugiyama.Rd +++ b/man/layout.sugiyama.Rd @@ -49,4 +49,8 @@ them.} \code{layout.sugiyama()} was renamed to \code{\link[=layout_with_sugiyama]{layout_with_sugiyama()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_sugiyama}{\code{layout_sugiyama()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/layout.svd.Rd b/man/layout.svd.Rd index c83ee8cc0a..1f7230aeb2 100644 --- a/man/layout.svd.Rd +++ b/man/layout.svd.Rd @@ -19,4 +19,8 @@ Layout coordinates, a two column matrix. Now it calls the Fruchterman-Reingold layout \code{\link[=layout_with_fr]{layout_with_fr()}}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/layout_as_bipartite.Rd b/man/layout_as_bipartite.Rd index e1c5b6b373..a1b48e08f0 100644 --- a/man/layout_as_bipartite.Rd +++ b/man/layout_as_bipartite.Rd @@ -43,6 +43,10 @@ to their types. Then the positions within the rows are optimized to minimize edge crossings, using the Sugiyama algorithm (see \code{\link[=layout_with_sugiyama]{layout_with_sugiyama()}}). } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_bipartite}{\code{layout_bipartite()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ # Random bipartite graph inc <- matrix(sample(0:1, 50, replace = TRUE, prob = c(2, 1)), 10, 5) diff --git a/man/layout_as_star.Rd b/man/layout_as_star.Rd index 62b616e2a7..99cacbba9e 100644 --- a/man/layout_as_star.Rd +++ b/man/layout_as_star.Rd @@ -32,6 +32,10 @@ and the rest of the vertices equidistantly on the perimeter. It is possible to choose the vertex that will be in the center, and the order of the vertices can be also given. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_star}{\code{layout_star()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_circle}{\code{layout_circle()}} +} + \examples{ g <- make_star(10) diff --git a/man/layout_as_tree.Rd b/man/layout_as_tree.Rd index 88441e6ac7..9b785edcf0 100644 --- a/man/layout_as_tree.Rd +++ b/man/layout_as_tree.Rd @@ -63,6 +63,10 @@ For the exact algorithm, the reference below. If the given graph is not a tree, a breadth-first search is executed first to obtain a possible spanning tree. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ tree <- make_tree(20, 3) diff --git a/man/layout_in_circle.Rd b/man/layout_in_circle.Rd index d510125956..7a3719e242 100644 --- a/man/layout_in_circle.Rd +++ b/man/layout_in_circle.Rd @@ -28,6 +28,10 @@ Place vertices on a circle, in the order of their vertex ids. If you want to order the vertices differently, then permute them using the \code{\link[=permute]{permute()}} function. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_circle}{\code{layout_circle()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ \dontshow{if (igraph:::has_glpk() && rlang::is_installed("igraphdata")) withAutoprint(\{ # examplesIf} diff --git a/man/layout_nicely.Rd b/man/layout_nicely.Rd index a8df056331..f498572e35 100644 --- a/man/layout_nicely.Rd +++ b/man/layout_nicely.Rd @@ -58,6 +58,10 @@ end up calling \code{layout_with_fr()} or \code{layout_with_drl()}, we do not forward the weights to these functions and issue a warning about this. You can use \code{weights = NA} to silence the warning. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_forest}{\code{is_forest()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \seealso{ \code{\link[=plot.igraph]{plot.igraph()}} diff --git a/man/layout_on_grid.Rd b/man/layout_on_grid.Rd index 57b7ebf1ff..22c30e1fb7 100644 --- a/man/layout_on_grid.Rd +++ b/man/layout_on_grid.Rd @@ -37,6 +37,10 @@ The function places the vertices on a simple rectangular grid, one after the other. If you want to change the order of the vertices, then see the \code{\link[=permute]{permute()}} function. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_grid}{\code{layout_grid()}}, \href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_grid_3d}{\code{layout_grid_3d()}} +} + \examples{ g <- make_lattice(c(3, 3)) diff --git a/man/layout_on_sphere.Rd b/man/layout_on_sphere.Rd index 717c0c0505..68b753d8fe 100644 --- a/man/layout_on_sphere.Rd +++ b/man/layout_on_sphere.Rd @@ -29,6 +29,10 @@ surface of a sphere, this is thus a 3d layout. It is not clear however what If you want to order the vertices differently, then permute them using the \code{\link[=permute]{permute()}} function. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_sphere}{\code{layout_sphere()}} +} + \seealso{ Other graph layouts: \code{\link{add_layout_}()}, diff --git a/man/layout_randomly.Rd b/man/layout_randomly.Rd index 88eb5cdb03..f03145c129 100644 --- a/man/layout_randomly.Rd +++ b/man/layout_randomly.Rd @@ -29,6 +29,10 @@ Randomly places vertices on a [-1,1] square (in 2d) or in a cube (in 3d). It is probably a useless layout, but it can use as a starting point for other layout generators. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_random}{\code{layout_random()}}, \href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_random_3d}{\code{layout_random_3d()}} +} + \seealso{ Other graph layouts: \code{\link{add_layout_}()}, diff --git a/man/layout_with_dh.Rd b/man/layout_with_dh.Rd index caa5b36d86..eca4a42266 100644 --- a/man/layout_with_dh.Rd +++ b/man/layout_with_dh.Rd @@ -84,6 +84,10 @@ Our implementation tries to follow the original publication, as much as possible. The only major difference is that coordinates are explicitly kept within the bounds of the rectangle of the layout. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_davidson_harel}{\code{layout_davidson_harel()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_density}{\code{density()}} +} + \examples{ set.seed(42) diff --git a/man/layout_with_drl.Rd b/man/layout_with_drl.Rd index a1624aeea0..86cfba2bcf 100644 --- a/man/layout_with_drl.Rd +++ b/man/layout_with_drl.Rd @@ -144,6 +144,10 @@ There are five pre-defined parameter settings as well, these are called \code{drl_defaults$coarsest}, \code{drl_defaults$refine} and \code{drl_defaults$final}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- as_undirected(sample_pa(100, m = 1)) diff --git a/man/layout_with_fr.Rd b/man/layout_with_fr.Rd index 8f059a3753..574d376cdb 100644 --- a/man/layout_with_fr.Rd +++ b/man/layout_with_fr.Rd @@ -95,6 +95,10 @@ See the referenced paper below for the details of the algorithm. This function was rewritten from scratch in igraph version 0.8.0. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # Fixing ego diff --git a/man/layout_with_gem.Rd b/man/layout_with_gem.Rd index ab7fe67ca6..1befff8315 100644 --- a/man/layout_with_gem.Rd +++ b/man/layout_with_gem.Rd @@ -50,6 +50,10 @@ Place vertices on the plane using the GEM force-directed layout algorithm. \details{ See the referenced paper below for the details of the algorithm. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_gem}{\code{layout_gem()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ set.seed(42) diff --git a/man/layout_with_kk.Rd b/man/layout_with_kk.Rd index 8b1d42cd5a..71230b7235 100644 --- a/man/layout_with_kk.Rd +++ b/man/layout_with_kk.Rd @@ -94,6 +94,10 @@ See the referenced paper below for the details of the algorithm. This function was rewritten from scratch in igraph version 0.8.0 and it follows truthfully the original publication by Kamada and Kawai now. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_ring(10) diff --git a/man/layout_with_lgl.Rd b/man/layout_with_lgl.Rd index d7bcfba38d..0323ba0414 100644 --- a/man/layout_with_lgl.Rd +++ b/man/layout_with_lgl.Rd @@ -55,6 +55,10 @@ A layout generator for larger graphs. generator of the Large Graph Layout software (\url{https://lgl.sourceforge.net/}). } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \seealso{ Other graph layouts: \code{\link{add_layout_}()}, diff --git a/man/layout_with_mds.Rd b/man/layout_with_mds.Rd index fd54297914..12bef37129 100644 --- a/man/layout_with_mds.Rd +++ b/man/layout_with_mds.Rd @@ -48,6 +48,10 @@ multidimensional scaling may assign the same coordinates to these vertices. This function generates the layout separately for each graph component and then merges them via \code{\link[=merge_coords]{merge_coords()}}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_mds}{\code{layout_mds()}} +} + \examples{ g <- sample_gnp(100, 2 / 100) diff --git a/man/layout_with_sugiyama.Rd b/man/layout_with_sugiyama.Rd index fe85bdd414..7c6c7906b3 100644 --- a/man/layout_with_sugiyama.Rd +++ b/man/layout_with_sugiyama.Rd @@ -91,6 +91,10 @@ the dummy nodes. For more details, see the reference below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Layout.html#igraph_layout_sugiyama}{\code{layout_sugiyama()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## Data taken from http://tehnick-8.narod.ru/dc_clients/ diff --git a/man/leading.eigenvector.community.Rd b/man/leading.eigenvector.community.Rd index 8665e80228..aae8f85072 100644 --- a/man/leading.eigenvector.community.Rd +++ b/man/leading.eigenvector.community.Rd @@ -49,4 +49,8 @@ the modularity matrix. See details below.} \code{leading.eigenvector.community()} was renamed to \code{\link[=cluster_leading_eigen]{cluster_leading_eigen()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/line.graph.Rd b/man/line.graph.Rd index bd56ef4771..aa80ca9594 100644 --- a/man/line.graph.Rd +++ b/man/line.graph.Rd @@ -15,4 +15,8 @@ line.graph(graph) \code{line.graph()} was renamed to \code{\link[=make_line_graph]{make_line_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_linegraph}{\code{linegraph()}} +} + \keyword{internal} diff --git a/man/local_scan.Rd b/man/local_scan.Rd index 31fd22f9d2..986b7394ff 100644 --- a/man/local_scan.Rd +++ b/man/local_scan.Rd @@ -83,6 +83,10 @@ variant is computed using \code{graph.us} to extract the neighborhood information, and applying \code{FUN} on these neighborhoods in \code{graph.them}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_0}{\code{local_scan_0()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_0_them}{\code{local_scan_0_them()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_1_ecount}{\code{local_scan_1_ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_1_ecount_them}{\code{local_scan_1_ecount_them()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_k_ecount}{\code{local_scan_k_ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_k_ecount_them}{\code{local_scan_k_ecount_them()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_neighborhood_ecount}{\code{local_scan_neighborhood_ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_induced_subgraph}{\code{induced_subgraph()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ pair <- sample_correlated_gnp_pair(n = 10^3, corr = 0.8, p = 0.1) local_0_us <- local_scan(graph.us = pair$graph1, k = 0) diff --git a/man/make_.Rd b/man/make_.Rd index d12befb19f..ae2dd054e6 100644 --- a/man/make_.Rd +++ b/man/make_.Rd @@ -30,6 +30,10 @@ to the newly created graphs. See the examples and the various constructor modifiers below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ r <- make_(ring(10)) l <- make_(lattice(c(3, 3, 3))) diff --git a/man/make_bipartite_graph.Rd b/man/make_bipartite_graph.Rd index 370fc49392..d1b85014df 100644 --- a/man/make_bipartite_graph.Rd +++ b/man/make_bipartite_graph.Rd @@ -46,6 +46,10 @@ a vertex attribute called \code{type}. \code{edges} may contain strings as vertex names; in this case, \code{types} must be a named vector that specifies the type for each vertex name that occurs in \code{edges}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_bipartite_graph(rep(0:1, length.out = 10), c(1:10)) diff --git a/man/make_chordal_ring.Rd b/man/make_chordal_ring.Rd index 35272853ac..234b767de2 100644 --- a/man/make_chordal_ring.Rd +++ b/man/make_chordal_ring.Rd @@ -33,6 +33,10 @@ of rows in \sQuote{\code{W}}: for each row \code{j} an edge of total nodes. See also Kotsis, G: Interconnection Topologies for Parallel Processing Systems, PARS Mitteilungen 11, 1-6, 1993. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_extended_chordal_ring}{\code{extended_chordal_ring()}} +} + \examples{ chord <- make_chordal_ring( 15, diff --git a/man/make_circulant.Rd b/man/make_circulant.Rd index e07ee680f6..c5ca75834b 100644 --- a/man/make_circulant.Rd +++ b/man/make_circulant.Rd @@ -28,6 +28,10 @@ A circulant graph \eqn{C_n^{\textrm{shifts}}} consists of \eqn{n} vertices The function can generate either directed or undirected graphs. It does not generate multi-edges or self-loops. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_circulant}{\code{circulant()}} +} + \examples{ # Create a circulant graph with 10 vertices and shifts 1 and 3 g <- make_circulant(10, c(1, 3)) diff --git a/man/make_de_bruijn_graph.Rd b/man/make_de_bruijn_graph.Rd index 97de3e31c1..e803f576e2 100644 --- a/man/make_de_bruijn_graph.Rd +++ b/man/make_de_bruijn_graph.Rd @@ -35,6 +35,10 @@ for \code{m} and \code{n}. De Bruijn graphs have some interesting properties, please see another source, e.g. Wikipedia for details. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_de_bruijn}{\code{de_bruijn()}} +} + \examples{ # de Bruijn graphs can be created recursively by line graphs as well diff --git a/man/make_empty_graph.Rd b/man/make_empty_graph.Rd index a4772ce95d..3ee8ce29fa 100644 --- a/man/make_empty_graph.Rd +++ b/man/make_empty_graph.Rd @@ -20,6 +20,10 @@ An igraph graph. \description{ A graph with no edges } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}} +} + \examples{ make_empty_graph(n = 10) make_empty_graph(n = 5, directed = FALSE) @@ -45,5 +49,3 @@ Other deterministic constructors: } \concept{Empty graph.} \concept{deterministic constructors} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_empty}{\code{empty()}}.} - diff --git a/man/make_from_prufer.Rd b/man/make_from_prufer.Rd index cb06510bf0..b1c84fc46f 100644 --- a/man/make_from_prufer.Rd +++ b/man/make_from_prufer.Rd @@ -26,6 +26,10 @@ find a vertex with degree one, remove it from the tree and add the label of the vertex that it was connected to to the sequence. Repeat until there are only two vertices in the remaining graph. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_from_prufer}{\code{from_prufer()}} +} + \examples{ g <- make_tree(13, 3) @@ -42,5 +46,3 @@ Other trees: } \concept{trees} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_from_prufer}{\code{from_prufer()}}.} - diff --git a/man/make_full_bipartite_graph.Rd b/man/make_full_bipartite_graph.Rd index 709aa2a08a..54e8aae4f0 100644 --- a/man/make_full_bipartite_graph.Rd +++ b/man/make_full_bipartite_graph.Rd @@ -39,6 +39,10 @@ Bipartite graphs have a \sQuote{\code{type}} vertex attribute in igraph, this is boolean and \code{FALSE} for the vertices of the first kind and \code{TRUE} for vertices of the second kind. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_full_bipartite}{\code{full_bipartite()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_full_bipartite_graph(2, 3) diff --git a/man/make_full_citation_graph.Rd b/man/make_full_citation_graph.Rd index 062f9aca97..c0a568e8e9 100644 --- a/man/make_full_citation_graph.Rd +++ b/man/make_full_citation_graph.Rd @@ -22,6 +22,10 @@ An igraph graph. directed graph, where every \code{i->j} edge is present if and only if \eqn{j}} } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_all_minimal_st_separators}{\code{all_minimal_st_separators()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ring <- make_ring(4) @@ -84,5 +88,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{flow} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_all_minimal_st_separators}{\code{all_minimal_st_separators()}}.} - diff --git a/man/minimal.st.separators.Rd b/man/minimal.st.separators.Rd index f318da5a8f..bd129912c5 100644 --- a/man/minimal.st.separators.Rd +++ b/man/minimal.st.separators.Rd @@ -16,4 +16,8 @@ ignored.} \code{minimal.st.separators()} was renamed to \code{\link[=min_st_separators]{min_st_separators()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_all_minimal_st_separators}{\code{all_minimal_st_separators()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/minimum.size.separators.Rd b/man/minimum.size.separators.Rd index 39ebaa5881..1ec1584542 100644 --- a/man/minimum.size.separators.Rd +++ b/man/minimum.size.separators.Rd @@ -16,4 +16,8 @@ ignored.} \code{minimum.size.separators()} was renamed to \code{\link[=min_separators]{min_separators()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Separators.html#igraph_minimum_size_separators}{\code{minimum_size_separators()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/minimum.spanning.tree.Rd b/man/minimum.spanning.tree.Rd index 79dc14a82d..fafd09565f 100644 --- a/man/minimum.spanning.tree.Rd +++ b/man/minimum.spanning.tree.Rd @@ -29,4 +29,8 @@ algorithm is chosen, otherwise the unweighted algorithm is used.} \code{minimum.spanning.tree()} was renamed to \code{\link[=mst]{mst()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_minimum_spanning_tree_unweighted}{\code{minimum_spanning_tree_unweighted()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_minimum_spanning_tree_prim}{\code{minimum_spanning_tree_prim()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/mod.matrix.Rd b/man/mod.matrix.Rd index c4da04d2a1..e9b1710003 100644 --- a/man/mod.matrix.Rd +++ b/man/mod.matrix.Rd @@ -24,4 +24,8 @@ modularity. Ignored for undirected graphs.} \code{mod.matrix()} was renamed to \code{\link[=modularity_matrix]{modularity_matrix()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_modularity_matrix}{\code{modularity_matrix()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/modularity.igraph.Rd b/man/modularity.igraph.Rd index d83214c0c0..59532a3595 100644 --- a/man/modularity.igraph.Rd +++ b/man/modularity.igraph.Rd @@ -83,6 +83,10 @@ weighted) adjacency matrix, \eqn{d_i}{d[i]} is the degree of vertex \eqn{i}, and \eqn{m} is the number of edges (or the total weights in the graph, if it is weighed). } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_modularity}{\code{modularity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_modularity_matrix}{\code{modularity_matrix()}} +} + \examples{ g <- make_full_graph(5) \%du\% make_full_graph(5) \%du\% make_full_graph(5) diff --git a/man/motifs.Rd b/man/motifs.Rd index 4dac8c0568..b5956d3758 100644 --- a/man/motifs.Rd +++ b/man/motifs.Rd @@ -33,6 +33,10 @@ numeric vector containing the number of different motifs. The order of the motifs is defined by their isomorphism class, see \code{\link[=isomorphism_class]{isomorphism_class()}}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_motifs_randesu}{\code{motifs_randesu()}} +} + \examples{ g <- sample_pa(100) motifs(g, 3) diff --git a/man/motifs_randesu_callback.Rd b/man/motifs_randesu_callback.Rd index ab1428e74d..a79a24e3e6 100644 --- a/man/motifs_randesu_callback.Rd +++ b/man/motifs_randesu_callback.Rd @@ -49,5 +49,3 @@ Other graph motifs: \code{\link{sample_motifs}()} } \concept{graph motifs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_motifs_randesu_callback}{\code{motifs_randesu_callback()}}.} - diff --git a/man/mst.Rd b/man/mst.Rd index 686678e50e..ddeab138e9 100644 --- a/man/mst.Rd +++ b/man/mst.Rd @@ -41,6 +41,10 @@ of minimum spanning trees of all of its components. If the graph is not connected a minimum spanning forest is returned. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_minimum_spanning_tree_unweighted}{\code{minimum_spanning_tree_unweighted()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_minimum_spanning_tree_prim}{\code{minimum_spanning_tree_prim()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_gnp(100, 3 / 100) diff --git a/man/multilevel.community.Rd b/man/multilevel.community.Rd index e72f66f2c3..884ba182c8 100644 --- a/man/multilevel.community.Rd +++ b/man/multilevel.community.Rd @@ -29,4 +29,8 @@ is set to 1.} \code{multilevel.community()} was renamed to \code{\link[=cluster_louvain]{cluster_louvain()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_multilevel}{\code{community_multilevel()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/neighborhood.size.Rd b/man/neighborhood.size.Rd index b52295c691..23f8d606ee 100644 --- a/man/neighborhood.size.Rd +++ b/man/neighborhood.size.Rd @@ -36,4 +36,8 @@ argument is ignored for undirected graphs.} \code{neighborhood.size()} was renamed to \code{\link[=ego_size]{ego_size()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/neighbors.Rd b/man/neighbors.Rd index b97ce8ef93..ceb0c2057e 100644 --- a/man/neighbors.Rd +++ b/man/neighbors.Rd @@ -22,6 +22,10 @@ A vertex sequence containing the neighbors of the input vertex. A vertex is a neighbor of another one (in other words, the two vertices are adjacent), if they are incident to the same edge. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_neighbors}{\code{neighbors()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_graph("Zachary") n1 <- neighbors(g, 1) diff --git a/man/optimal.community.Rd b/man/optimal.community.Rd index 7bef05e310..8dc5ab585a 100644 --- a/man/optimal.community.Rd +++ b/man/optimal.community.Rd @@ -23,4 +23,8 @@ edge weight means a stronger connection for this function.} \code{optimal.community()} was renamed to \code{\link[=cluster_optimal]{cluster_optimal()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_community_optimal_modularity}{\code{community_optimal_modularity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/page.rank.Rd b/man/page.rank.Rd index 69075bee79..f497780c36 100644 --- a/man/page.rank.Rd +++ b/man/page.rank.Rd @@ -60,4 +60,8 @@ implementation is used.} \code{page.rank()} was renamed to \code{\link[=page_rank]{page_rank()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_personalized_pagerank}{\code{personalized_pagerank()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/page_rank.Rd b/man/page_rank.Rd index 182032cf71..4c588441ae 100644 --- a/man/page_rank.Rd +++ b/man/page_rank.Rd @@ -89,6 +89,10 @@ some of the vertices, all of them must be calculated. Requesting the PageRank for only some of the vertices does not result in any performance increase at all. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_personalized_pagerank}{\code{personalized_pagerank()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- sample_gnp(20, 5 / 20, directed = TRUE) @@ -132,5 +136,3 @@ Tamas Nepusz \email{ntamas@gmail.com} and Gabor Csardi } \concept{centrality} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_personalized_pagerank}{\code{personalized_pagerank()}}.} - diff --git a/man/path.length.hist.Rd b/man/path.length.hist.Rd index 0a75217313..5d3b95ae97 100644 --- a/man/path.length.hist.Rd +++ b/man/path.length.hist.Rd @@ -18,4 +18,8 @@ this argument is ignored for undirected graphs.} \code{path.length.hist()} was renamed to \code{\link[=distance_table]{distance_table()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_path_length_hist}{\code{path_length_hist()}} +} + \keyword{internal} diff --git a/man/permute.Rd b/man/permute.Rd index cfb4273341..3f4c52075b 100644 --- a/man/permute.Rd +++ b/man/permute.Rd @@ -27,6 +27,10 @@ of a graph. \code{permute()} keeps all graph, vertex and edge attributes of the graph. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}} +} + \examples{ # Random permutation of a random graph @@ -79,5 +83,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{functions for manipulating graph structure} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}}.} - diff --git a/man/permute.vertices.Rd b/man/permute.vertices.Rd index 33be49ef11..71814f8aee 100644 --- a/man/permute.vertices.Rd +++ b/man/permute.vertices.Rd @@ -19,4 +19,8 @@ first element is the new id of vertex 1, etc. Every number between one and \code{permute.vertices()} was renamed to \code{\link[=permute]{permute()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}} +} + \keyword{internal} diff --git a/man/piecewise.layout.Rd b/man/piecewise.layout.Rd index 093943ac13..5483f9f42e 100644 --- a/man/piecewise.layout.Rd +++ b/man/piecewise.layout.Rd @@ -20,4 +20,8 @@ function.} \code{piecewise.layout()} was renamed to \code{\link[=layout_components]{layout_components()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/plot.igraph.Rd b/man/plot.igraph.Rd index 95d371b899..10fcb5bcde 100644 --- a/man/plot.igraph.Rd +++ b/man/plot.igraph.Rd @@ -84,6 +84,10 @@ first, handtune the placement of the vertices, query the coordinates by the \code{\link[=tk_coords]{tk_coords()}} function and use them with \code{\link[=plot]{plot()}} to plot the graph to any R device. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_incident}{\code{incident()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_loop}{\code{is_loop()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}} +} + \examples{ g <- make_ring(10) diff --git a/man/plotHierarchy.Rd b/man/plotHierarchy.Rd index 2973c4f939..16e6159365 100644 --- a/man/plotHierarchy.Rd +++ b/man/plotHierarchy.Rd @@ -24,4 +24,8 @@ them to \code{plot.igraph()}. \code{\link[=print]{print()}} and \code{\link[=su \code{plotHierarchy()} was renamed to \code{\link[=plot_hierarchy]{plot_hierarchy()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/power_centrality.Rd b/man/power_centrality.Rd index aeb2c85dd2..e5cac58391 100644 --- a/man/power_centrality.Rd +++ b/man/power_centrality.Rd @@ -102,6 +102,10 @@ this algorithm; thus, the routine may fail in certain cases. This will be fixed when we get a better algorithm. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_degree}{\code{degree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # Generate some test data from Bonacich, 1987: diff --git a/man/predict_edges.Rd b/man/predict_edges.Rd index 171c90e230..95dd77699f 100644 --- a/man/predict_edges.Rd +++ b/man/predict_edges.Rd @@ -52,6 +52,10 @@ sampling is stated from \code{hrg()}, if it is given and the \code{start} argument is set to \code{TRUE}. Otherwise a HRG is fitted to the graph first. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_predict}{\code{hrg_predict()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ \dontshow{if (rlang::is_interactive()) withAutoprint(\{ # examplesIf} diff --git a/man/preference.game.Rd b/man/preference.game.Rd index 8dffee357d..c890b505fb 100644 --- a/man/preference.game.Rd +++ b/man/preference.game.Rd @@ -41,4 +41,8 @@ an undirected graph, it must be symmetric.} \code{preference.game()} was renamed to \code{\link[=sample_pref]{sample_pref()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_preference_game}{\code{preference_game()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/print.igraph.Rd b/man/print.igraph.Rd index 56e401d965..54e9177f0f 100644 --- a/man/print.igraph.Rd +++ b/man/print.igraph.Rd @@ -101,6 +101,10 @@ As of igraph 0.4 \code{print_all()} and \code{print.igraph()} use the As of igraph 1.1.1, the \code{str.igraph} function is defunct, use \code{print_all()}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_degree}{\code{degree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}} +} + \examples{ g <- make_ring(10) diff --git a/man/print.igraph.es.Rd b/man/print.igraph.es.Rd index 03ebef085f..618dd8e372 100644 --- a/man/print.igraph.es.Rd +++ b/man/print.igraph.es.Rd @@ -29,6 +29,10 @@ Edge sequences created with the double bracket operator are printed differently, together with all attributes of the edges in the sequence, as a table. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ # Unnamed graphs g <- make_ring(10) diff --git a/man/print.igraph.vs.Rd b/man/print.igraph.vs.Rd index 4432620868..a1df8d544b 100644 --- a/man/print.igraph.vs.Rd +++ b/man/print.igraph.vs.Rd @@ -29,6 +29,10 @@ Vertex sequence created with the double bracket operator are printed differently, together with all attributes of the vertices in the sequence, as a table. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ # Unnamed graphs g <- make_ring(10) diff --git a/man/radius.Rd b/man/radius.Rd index 16cb54ccbe..186bd0bb18 100644 --- a/man/radius.Rd +++ b/man/radius.Rd @@ -39,6 +39,10 @@ graph, and taking the maximum. This implementation ignores vertex pairs that are in different components. Isolated vertices have eccentricity zero. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_radius_dijkstra}{\code{radius_dijkstra()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_star(10, mode = "undirected") eccentricity(g) @@ -61,5 +65,3 @@ Other paths: \code{\link{graph_center}()} } \concept{paths} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_radius_dijkstra}{\code{radius_dijkstra()}}.} - diff --git a/man/random_walk.Rd b/man/random_walk.Rd index 22105a3c22..d4c92eca56 100644 --- a/man/random_walk.Rd +++ b/man/random_walk.Rd @@ -65,6 +65,10 @@ For igraph < 1.6.0, \code{random_walk()} counted steps differently, and returned a sequence of length \code{steps} instead of \code{steps + 1}. This has changed to improve consistency with the underlying C library. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Visitors.html#igraph_random_walk}{\code{random_walk()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## Stationary distribution of a Markov chain g <- make_ring(10, directed = TRUE) \%u\% @@ -81,5 +85,3 @@ cor(table(w), ec) cor(table(w), pg) } \concept{random_walk} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Visitors.html#igraph_random_walk}{\code{random_walk()}}.} - diff --git a/man/read.graph.Rd b/man/read.graph.Rd index 9c9bf90676..224c0b9de2 100644 --- a/man/read.graph.Rd +++ b/man/read.graph.Rd @@ -30,4 +30,8 @@ insensitive.} \code{read.graph()} was renamed to \code{\link[=read_graph]{read_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_pajek}{\code{read_graph_pajek()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphml}{\code{read_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_gml}{\code{read_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_dl}{\code{read_graph_dl()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphdb}{\code{read_graph_graphdb()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/read_graph.Rd b/man/read_graph.Rd index 3ce30e9c1a..a8b2bf3e5f 100644 --- a/man/read_graph.Rd +++ b/man/read_graph.Rd @@ -183,6 +183,10 @@ This is a binary format, used in the ARG Graph Database for isomorphism testing. } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_pajek}{\code{read_graph_pajek()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphml}{\code{read_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_gml}{\code{read_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_dl}{\code{read_graph_dl()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphdb}{\code{read_graph_graphdb()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \seealso{ \code{\link[=write_graph]{write_graph()}} @@ -195,5 +199,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{foreign} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_dimacs_flow}{\code{read_graph_dimacs_flow()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_dl}{\code{read_graph_dl()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_edgelist}{\code{read_graph_edgelist()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_gml}{\code{read_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphdb}{\code{read_graph_graphdb()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphml}{\code{read_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_lgl}{\code{read_graph_lgl()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_ncol}{\code{read_graph_ncol()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_pajek}{\code{read_graph_pajek()}}.} - diff --git a/man/realize_bipartite_degseq.Rd b/man/realize_bipartite_degseq.Rd index 873e9d12c0..ed2de335ad 100644 --- a/man/realize_bipartite_degseq.Rd +++ b/man/realize_bipartite_degseq.Rd @@ -52,6 +52,10 @@ assortativity, and is often disconnected. The \dQuote{index} method selects the vertices in order of their index. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_realize_bipartite_degree_sequence}{\code{realize_bipartite_degree_sequence()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- realize_bipartite_degseq(c(3, 3, 2, 1, 1), c(2, 2, 2, 2, 2)) degree(g) @@ -60,5 +64,3 @@ degree(g) \code{\link[=realize_degseq]{realize_degseq()}} to create a not necessarily bipartite graph. } \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_realize_bipartite_degree_sequence}{\code{realize_bipartite_degree_sequence()}}.} - diff --git a/man/realize_degseq.Rd b/man/realize_degseq.Rd index 8b2e2fcad2..86637ef84a 100644 --- a/man/realize_degseq.Rd +++ b/man/realize_degseq.Rd @@ -60,6 +60,10 @@ and is often disconnected. The \dQuote{index} method selects the vertices in order of their index. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_realize_degree_sequence}{\code{realize_degree_sequence()}} +} + \examples{ g <- realize_degseq(rep(2, 100)) @@ -111,5 +115,3 @@ Connectedness matters: construction and exact random sampling of connected netwo from graphs with the given degree sequence. } \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_realize_degree_sequence}{\code{realize_degree_sequence()}}.} - diff --git a/man/reciprocity.Rd b/man/reciprocity.Rd index 72b7131321..b67a0a2f55 100644 --- a/man/reciprocity.Rd +++ b/man/reciprocity.Rd @@ -35,6 +35,10 @@ not-connected, (2) non-reciprocally connected, (3) reciprocally connected. The result is the size of group (3), divided by the sum of group sizes (2)+(3). This measure is calculated if \code{mode} is \code{ratio}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_reciprocity}{\code{reciprocity()}} +} + \examples{ g <- sample_gnp(20, 5 / 20, directed = TRUE) @@ -74,5 +78,3 @@ Tamas Nepusz \email{ntamas@gmail.com} and Gabor Csardi } \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_reciprocity}{\code{reciprocity()}}.} - diff --git a/man/rep.igraph.Rd b/man/rep.igraph.Rd index 958ccaebdb..aae0e5d2e1 100644 --- a/man/rep.igraph.Rd +++ b/man/rep.igraph.Rd @@ -25,6 +25,10 @@ currently ignored.} The new graph will contain the input graph the given number of times, as unconnected components. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ rings <- make_ring(5) * 5 } diff --git a/man/reverse_edges.Rd b/man/reverse_edges.Rd index bc71af9cde..d26ffa31fb 100644 --- a/man/reverse_edges.Rd +++ b/man/reverse_edges.Rd @@ -26,6 +26,10 @@ the original graph, except that the direction of the edges selected by their edge IDs in the \code{eids} argument will be reversed. When reversing all edges, this operation is also known as graph transpose. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_reverse_edges}{\code{reverse_edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_graph(~ 1 -+ 2, 2 -+ 3, 3 -+ 4) @@ -59,5 +63,3 @@ Other functions for manipulating graph structure: \code{\link{vertex}()} } \concept{functions for manipulating graph structure} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_reverse_edges}{\code{reverse_edges()}}.} - diff --git a/man/rglplot.Rd b/man/rglplot.Rd index 3a07886364..129f11d1c8 100644 --- a/man/rglplot.Rd +++ b/man/rglplot.Rd @@ -26,6 +26,10 @@ Note that \code{rglplot()} is considered to be highly experimental. It is not very useful either. See \link{igraph.plotting} for the possible arguments. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_lattice(c(5, 5, 5)) diff --git a/man/running.mean.Rd b/man/running.mean.Rd index d9bbfcd961..cb8cbc814d 100644 --- a/man/running.mean.Rd +++ b/man/running.mean.Rd @@ -18,4 +18,8 @@ i.e. smaller than the length of \code{v}.} \code{running.mean()} was renamed to \code{\link[=running_mean]{running_mean()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Nongraph.html#igraph_running_mean}{\code{running_mean()}} +} + \keyword{internal} diff --git a/man/running_mean.Rd b/man/running_mean.Rd index 313d274fbb..b4647bef64 100644 --- a/man/running_mean.Rd +++ b/man/running_mean.Rd @@ -25,6 +25,10 @@ The running mean of \code{v} is a \code{w} vector of length the first \code{binwidth} elements of \code{v}, the second element of \code{w} is the average of elements \code{2:(binwidth+1)}, etc. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Nongraph.html#igraph_running_mean}{\code{running_mean()}} +} + \examples{ running_mean(1:100, 10) diff --git a/man/sample_.Rd b/man/sample_.Rd index 5d671e3db4..04facaa5f7 100644 --- a/man/sample_.Rd +++ b/man/sample_.Rd @@ -30,6 +30,10 @@ to the newly created graphs. See the examples and the various constructor modifiers below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ pref_matrix <- cbind(c(0.8, 0.1), c(0.1, 0.7)) blocky <- sample_(sbm( diff --git a/man/sample_bipartite.Rd b/man/sample_bipartite.Rd index b0b68f3cc3..8343b014a8 100644 --- a/man/sample_bipartite.Rd +++ b/man/sample_bipartite.Rd @@ -51,6 +51,10 @@ A bipartite igraph graph. \ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} Generate bipartite graphs using the Erdős-Rényi model. Use \code{\link[=sample_bipartite_gnm]{sample_bipartite_gnm()}} and \code{\link[=sample_bipartite_gnp]{sample_bipartite_gnp()}} instead. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_game_gnm}{\code{bipartite_game_gnm()}}, \href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_game_gnp}{\code{bipartite_game_gnp()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ ## empty graph diff --git a/man/sample_bipartite_gnm.Rd b/man/sample_bipartite_gnm.Rd index 399484af61..0d29435ba2 100644 --- a/man/sample_bipartite_gnm.Rd +++ b/man/sample_bipartite_gnm.Rd @@ -61,6 +61,10 @@ In \eqn{G(n,p)} every possible edge between top and bottom vertices is realized with probability \eqn{p}, independently of the rest of the edges. In \eqn{G(n,m)}, we uniformly choose \eqn{m} edges to realize. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_game_gnm}{\code{bipartite_game_gnm()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Bipartite.html#igraph_bipartite_game_gnp}{\code{bipartite_game_gnp()}} +} + \examples{ ## empty graph diff --git a/man/sample_chung_lu.Rd b/man/sample_chung_lu.Rd index 28a0dfdbd5..2e8c93685c 100644 --- a/man/sample_chung_lu.Rd +++ b/man/sample_chung_lu.Rd @@ -126,6 +126,10 @@ introduced by Norros and Reittu (2006). For a discussion of these three model variants, see Section 16.4 of Bollobás, Janson, Riordan (2007), as well as Van Der Hofstad (2013). } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_chung_lu_game}{\code{chung_lu_game()}} +} + \examples{ g <- sample_chung_lu(c(3, 3, 2, 2, 2, 1, 1)) @@ -202,5 +206,3 @@ Random graph models (games) \code{\link{sample_tree}()} } \concept{games} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_chung_lu_game}{\code{chung_lu_game()}}.} - diff --git a/man/sample_correlated_gnp.Rd b/man/sample_correlated_gnp.Rd index 215c5f1c4c..41d79d4d19 100644 --- a/man/sample_correlated_gnp.Rd +++ b/man/sample_correlated_gnp.Rd @@ -42,6 +42,10 @@ and shuffling its vertices. \details{ Please see the reference given below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_correlated_game}{\code{correlated_game()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_density}{\code{density()}} +} + \examples{ g <- sample_gnp(1000, .1) g2 <- sample_correlated_gnp(g, corr = 0.5) @@ -84,5 +88,3 @@ Random graph models (games) \code{\link{sample_tree}()} } \concept{games} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_correlated_game}{\code{correlated_game()}}.} - diff --git a/man/sample_correlated_gnp_pair.Rd b/man/sample_correlated_gnp_pair.Rd index 8244f3a5bc..581c6e0c87 100644 --- a/man/sample_correlated_gnp_pair.Rd +++ b/man/sample_correlated_gnp_pair.Rd @@ -34,6 +34,10 @@ shuffling its vertices. \details{ Please see the reference given below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_correlated_pair_game}{\code{correlated_pair_game()}} +} + \examples{ gg <- sample_correlated_gnp_pair( n = 10, corr = .8, p = .5, @@ -78,5 +82,3 @@ Random graph models (games) } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_correlated_pair_game}{\code{correlated_pair_game()}}.} - diff --git a/man/sample_dirichlet.Rd b/man/sample_dirichlet.Rd index 3556ba13c4..c32f0a0357 100644 --- a/man/sample_dirichlet.Rd +++ b/man/sample_dirichlet.Rd @@ -26,6 +26,10 @@ random dot product graphs with given \eqn{\alpha}{alpha} parameter. The sample is drawn from \code{length(alpha)-1}-simplex. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Nongraph.html#igraph_sample_dirichlet}{\code{sample_dirichlet()}} +} + \examples{ lpvs.dir <- sample_dirichlet(n = 20, alpha = rep(1, 10)) RDP.graph.2 <- sample_dot_product(lpvs.dir) diff --git a/man/sample_dot_product.Rd b/man/sample_dot_product.Rd index a49e895d29..91ac7e240e 100644 --- a/man/sample_dot_product.Rd +++ b/man/sample_dot_product.Rd @@ -30,6 +30,10 @@ The dot product of the latent position vectors should be in the [0,1] interval, otherwise a warning is given. For negative dot products, no edges are added; dot products that are larger than one always add an edge. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_dot_product_game}{\code{dot_product_game()}} +} + \examples{ ## A randomly generated graph @@ -87,5 +91,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_dot_product_game}{\code{dot_product_game()}}.} - diff --git a/man/sample_fitness.Rd b/man/sample_fitness.Rd index 1502423df9..c0f01244a6 100644 --- a/man/sample_fitness.Rd +++ b/man/sample_fitness.Rd @@ -65,6 +65,10 @@ achieve this, you have to draw the fitness scores from the desired power-law distribution. Alternatively, you may use \code{\link[=sample_fitness_pl]{sample_fitness_pl()}} which generates the fitnesses for you with a given exponent. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_static_fitness_game}{\code{static_fitness_game()}} +} + \examples{ N <- 10000 @@ -111,5 +115,3 @@ Tamas Nepusz \email{ntamas@gmail.com} } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_static_fitness_game}{\code{static_fitness_game()}}.} - diff --git a/man/sample_fitness_pl.Rd b/man/sample_fitness_pl.Rd index f0c00c80f1..a305373f7f 100644 --- a/man/sample_fitness_pl.Rd +++ b/man/sample_fitness_pl.Rd @@ -68,6 +68,10 @@ constant chosen appropriately to ensure that the maximum degree is less than the square root of the number of edges times the average degree; see the paper of Chung and Lu, and Cho et al for more details. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_static_power_law_game}{\code{static_power_law_game()}} +} + \examples{ g <- sample_fitness_pl(10000, 30000, 2.2, 2.3) @@ -119,5 +123,3 @@ Tamas Nepusz \email{ntamas@gmail.com} } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_static_power_law_game}{\code{static_power_law_game()}}.} - diff --git a/man/sample_forestfire.Rd b/man/sample_forestfire.Rd index 76eff55ac9..013b8d4c44 100644 --- a/man/sample_forestfire.Rd +++ b/man/sample_forestfire.Rd @@ -53,6 +53,10 @@ corrected version is available from \url{https://www.cs.cmu.edu/~jure/pubs/powergrowth-tkdd.pdf}, our implementation is based on this. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_forest_fire_game}{\code{forest_fire_game()}} +} + \examples{ fire <- sample_forestfire(50, fw.prob = 0.37, bw.factor = 0.32 / 0.37) @@ -109,5 +113,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_forest_fire_game}{\code{forest_fire_game()}}.} - diff --git a/man/sample_gnm.Rd b/man/sample_gnm.Rd index f0663c0702..6d1a2aa102 100644 --- a/man/sample_gnm.Rd +++ b/man/sample_gnm.Rd @@ -30,6 +30,10 @@ The graph has \code{n} vertices and \code{m} edges. The edges are chosen uniform at random from the set of all vertex pairs. This set includes potential self-connections as well if the \code{loops} parameter is \code{TRUE}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_erdos_renyi_game_gnm}{\code{erdos_renyi_game_gnm()}} +} + \examples{ g <- sample_gnm(1000, 1000) diff --git a/man/sample_gnp.Rd b/man/sample_gnp.Rd index 0db7ea0681..5d5236e0d4 100644 --- a/man/sample_gnp.Rd +++ b/man/sample_gnp.Rd @@ -36,6 +36,10 @@ the average number of edges, \eqn{p m_\text{max}}, where \eqn{m_\text{max}} is the largest possible number of edges, which depends on whether the graph is directed or undirected and whether self-loops are allowed. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_erdos_renyi_game_gnp}{\code{erdos_renyi_game_gnp()}} +} + \examples{ # Random graph with expected mean degree of 2 diff --git a/man/sample_grg.Rd b/man/sample_grg.Rd index c698c3771e..bf60906312 100644 --- a/man/sample_grg.Rd +++ b/man/sample_grg.Rd @@ -35,6 +35,10 @@ connected with an undirected edge if they are closer to each other in Euclidean norm than a given radius. If the \code{torus} argument is \code{TRUE} then a unit area torus is used instead of a square. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_grg(1000, 0.05, torus = FALSE) diff --git a/man/sample_growing.Rd b/man/sample_growing.Rd index 2549c86287..8a3147163e 100644 --- a/man/sample_growing.Rd +++ b/man/sample_growing.Rd @@ -34,6 +34,10 @@ the graph and \code{m} new edges are created. If \code{citation} is vertices, otherwise the edges are connecting new vertex to uniformly randomly chosen old vertices. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_growing_random_game}{\code{growing_random_game()}} +} + \examples{ g <- sample_growing(500, citation = FALSE) @@ -74,5 +78,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_growing_random_game}{\code{growing_random_game()}}.} - diff --git a/man/sample_hierarchical_sbm.Rd b/man/sample_hierarchical_sbm.Rd index 0419070eb0..c164306420 100644 --- a/man/sample_hierarchical_sbm.Rd +++ b/man/sample_hierarchical_sbm.Rd @@ -39,6 +39,10 @@ Sampling from a hierarchical stochastic block model of networks. The function generates a random graph according to the hierarchical stochastic block model. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_hsbm_game}{\code{hsbm_game()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_hsbm_list_game}{\code{hsbm_list_game()}} +} + \examples{ ## Ten blocks with three clusters each @@ -89,5 +93,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_hsbm_game}{\code{hsbm_game()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_hsbm_list_game}{\code{hsbm_list_game()}}.} - diff --git a/man/sample_hrg.Rd b/man/sample_hrg.Rd index 410101be39..0e4ae707c9 100644 --- a/man/sample_hrg.Rd +++ b/man/sample_hrg.Rd @@ -16,6 +16,10 @@ An igraph graph. \code{sample_hrg()} samples a graph from a given hierarchical random graph model. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_game}{\code{hrg_game()}} +} + \seealso{ Other hierarchical random graph functions: \code{\link{consensus_tree}()}, @@ -28,5 +32,3 @@ Other hierarchical random graph functions: \code{\link{print.igraphHRGConsensus}()} } \concept{hierarchical random graph functions} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-HRG.html#igraph_hrg_game}{\code{hrg_game()}}.} - diff --git a/man/sample_islands.Rd b/man/sample_islands.Rd index 20c0536f2f..920f26b629 100644 --- a/man/sample_islands.Rd +++ b/man/sample_islands.Rd @@ -32,6 +32,10 @@ oc } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_simple_interconnected_islands_game}{\code{simple_interconnected_islands_game()}} +} + \seealso{ \code{\link[=sample_gnp]{sample_gnp()}} @@ -68,5 +72,3 @@ Samuel Thiriot } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_simple_interconnected_islands_game}{\code{simple_interconnected_islands_game()}}.} - diff --git a/man/sample_k_regular.Rd b/man/sample_k_regular.Rd index 102511c17d..535474883b 100644 --- a/man/sample_k_regular.Rd +++ b/man/sample_k_regular.Rd @@ -31,6 +31,10 @@ least one of k and the number of vertices must be even. The game simply uses \code{\link[=sample_degseq]{sample_degseq()}} with appropriately constructed degree sequences. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_k_regular_game}{\code{k_regular_game()}} +} + \examples{ ## A simple ring @@ -80,5 +84,3 @@ Tamas Nepusz \email{ntamas@gmail.com} } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_k_regular_game}{\code{k_regular_game()}}.} - diff --git a/man/sample_last_cit.Rd b/man/sample_last_cit.Rd index 579c00865e..61c8870e35 100644 --- a/man/sample_last_cit.Rd +++ b/man/sample_last_cit.Rd @@ -96,6 +96,10 @@ graph is growing. but the probability of an edge depends on the (potentially) cited vertex only. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \seealso{ Random graph models (games) \code{\link{bipartite_gnm}()}, diff --git a/man/sample_motifs.Rd b/man/sample_motifs.Rd index 441611a341..e2c9774e01 100644 --- a/man/sample_motifs.Rd +++ b/man/sample_motifs.Rd @@ -42,6 +42,10 @@ structure. These functions search a graph for various motifs. \code{sample_motifs()} estimates the total number of motifs of a given size in a graph based on a sample. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_motifs_randesu_estimate}{\code{motifs_randesu_estimate()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_pa(100) motifs(g, 3) diff --git a/man/sample_pa.Rd b/man/sample_pa.Rd index c7c6608bcd..d96fa2a699 100644 --- a/man/sample_pa.Rd +++ b/man/sample_pa.Rd @@ -121,6 +121,10 @@ of adjacent edges not initiated by the vertex itself and not the total (in- + out-) degree of the vertex, unless the \code{out.pref} argument is set to \code{TRUE}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_pa(10000) diff --git a/man/sample_pref.Rd b/man/sample_pref.Rd index 79468425ca..eeacb0c972 100644 --- a/man/sample_pref.Rd +++ b/man/sample_pref.Rd @@ -92,6 +92,10 @@ The types of the generated vertices can be retrieved from the \code{type} vertex attribute for \code{sample_pref()} and from the \code{intype} and \code{outtype} vertex attribute for \code{sample_asym_pref()}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_preference_game}{\code{preference_game()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_asymmetric_preference_game}{\code{asymmetric_preference_game()}} +} + \examples{ pf <- matrix(c(1, 0, 0, 1), nrow = 2) diff --git a/man/sample_sbm.Rd b/man/sample_sbm.Rd index 77f138dfa3..088bbd8094 100644 --- a/man/sample_sbm.Rd +++ b/man/sample_sbm.Rd @@ -38,6 +38,10 @@ probabilities given by the Bernoulli rate matrix, \code{pref.matrix}. The order of the vertices in the generated graph corresponds to the \code{block.sizes} argument. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_sbm_game}{\code{sbm_game()}} +} + \examples{ ## Two groups with not only few connection between groups @@ -83,5 +87,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_sbm_game}{\code{sbm_game()}}.} - diff --git a/man/sample_spanning_tree.Rd b/man/sample_spanning_tree.Rd index 69efb56e52..9473ca260b 100644 --- a/man/sample_spanning_tree.Rd +++ b/man/sample_spanning_tree.Rd @@ -25,6 +25,10 @@ An edge sequence containing the edges of the spanning tree. Use \code{sample_spanning_tree()} picks a spanning tree of an undirected graph randomly and uniformly, using loop-erased random walks. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_random_spanning_tree}{\code{random_spanning_tree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_ecount}{\code{ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_full_graph(10) \%du\% make_full_graph(5) @@ -43,5 +47,3 @@ Other trees: } \concept{trees} \keyword{graph} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_random_spanning_tree}{\code{random_spanning_tree()}}.} - diff --git a/man/sample_sphere_surface.Rd b/man/sample_sphere_surface.Rd index 39204df1be..ec6973f3e6 100644 --- a/man/sample_sphere_surface.Rd +++ b/man/sample_sphere_surface.Rd @@ -30,6 +30,10 @@ random dot product graphs (the \code{(dim-1)}-sphere) with radius \code{radius}, i.e. the Euclidean norm of the samples equal \code{radius}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Nongraph.html#igraph_sample_sphere_surface}{\code{sample_sphere_surface()}} +} + \examples{ lpvs.sph <- sample_sphere_surface(dim = 10, n = 20, radius = 1) RDP.graph.3 <- sample_dot_product(lpvs.sph) diff --git a/man/sample_sphere_volume.Rd b/man/sample_sphere_volume.Rd index efea6cc78d..6767613b2c 100644 --- a/man/sample_sphere_volume.Rd +++ b/man/sample_sphere_volume.Rd @@ -30,6 +30,10 @@ random dot product graphs (the \code{(dim-1)}-sphere) i.e. the Euclidean norm of the samples is smaller or equal to \code{radius}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Nongraph.html#igraph_sample_sphere_volume}{\code{sample_sphere_volume()}} +} + \examples{ lpvs.sph.vol <- sample_sphere_volume(dim = 10, n = 20, radius = 1) RDP.graph.4 <- sample_dot_product(lpvs.sph.vol) diff --git a/man/sample_tree.Rd b/man/sample_tree.Rd index f2e025926a..ddc951b433 100644 --- a/man/sample_tree.Rd +++ b/man/sample_tree.Rd @@ -30,6 +30,10 @@ at random from the set of labelled trees. In other words, the function generates each possible labelled tree with the given number of nodes with the same probability. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_tree_game}{\code{tree_game()}} +} + \examples{ g <- sample_tree(100, method = "lerw") @@ -66,5 +70,3 @@ Random graph models (games) } \concept{games} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_tree_game}{\code{tree_game()}}.} - diff --git a/man/sbm.game.Rd b/man/sbm.game.Rd index 64b941fab8..3526138247 100644 --- a/man/sbm.game.Rd +++ b/man/sbm.game.Rd @@ -28,4 +28,8 @@ group. The sum of the vector must match the number of vertices.} \code{sbm.game()} was renamed to \code{\link[=sample_sbm]{sample_sbm()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_sbm_game}{\code{sbm_game()}} +} + \keyword{internal} diff --git a/man/scan_stat.Rd b/man/scan_stat.Rd index c3b3f8e778..6b599d3967 100644 --- a/man/scan_stat.Rd +++ b/man/scan_stat.Rd @@ -44,6 +44,10 @@ This is done by calculating the local scan statistics for each graph and each vertex, and then normalizing across the vertices and across the time steps. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_0}{\code{local_scan_0()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_0_them}{\code{local_scan_0_them()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_1_ecount}{\code{local_scan_1_ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_1_ecount_them}{\code{local_scan_1_ecount_them()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_k_ecount}{\code{local_scan_k_ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_k_ecount_them}{\code{local_scan_k_ecount_them()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_scan_neighborhood_ecount}{\code{local_scan_neighborhood_ecount()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_induced_subgraph}{\code{induced_subgraph()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## Generate a bunch of SBMs, with the last one being different num_t <- 20 diff --git a/man/set.edge.attribute.Rd b/man/set.edge.attribute.Rd index 1122bb1bd1..e9b62fd548 100644 --- a/man/set.edge.attribute.Rd +++ b/man/set.edge.attribute.Rd @@ -24,4 +24,8 @@ If \code{NULL}, the input is returned unchanged.} \code{set.edge.attribute()} was renamed to \code{\link[=set_edge_attr]{set_edge_attr()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/set.vertex.attribute.Rd b/man/set.vertex.attribute.Rd index 2909519c57..add9527008 100644 --- a/man/set.vertex.attribute.Rd +++ b/man/set.vertex.attribute.Rd @@ -24,4 +24,8 @@ If \code{NULL}, the input is returned unchanged.} \code{set.vertex.attribute()} was renamed to \code{\link[=set_vertex_attr]{set_vertex_attr()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/set_edge_attr.Rd b/man/set_edge_attr.Rd index 739db4799f..bc8f2627e0 100644 --- a/man/set_edge_attr.Rd +++ b/man/set_edge_attr.Rd @@ -24,6 +24,10 @@ The graph, with the edge attribute added or set. \description{ Set edge attributes } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) \%>\% set_edge_attr("label", value = LETTERS[1:10]) diff --git a/man/set_vertex_attr.Rd b/man/set_vertex_attr.Rd index 0c4328cbb9..61ec1c642a 100644 --- a/man/set_vertex_attr.Rd +++ b/man/set_vertex_attr.Rd @@ -24,6 +24,10 @@ The graph, with the vertex attribute added or set. \description{ Set vertex attributes } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) \%>\% set_vertex_attr("label", value = LETTERS[1:10]) diff --git a/man/set_vertex_attrs.Rd b/man/set_vertex_attrs.Rd index a0d14aa0cd..4dad4d9334 100644 --- a/man/set_vertex_attrs.Rd +++ b/man/set_vertex_attrs.Rd @@ -20,6 +20,10 @@ The graph, with the vertex attributes added or set. \description{ Set multiple vertex attributes } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) set_vertex_attrs(g, color = "blue", size = 10, name = LETTERS[1:10]) diff --git a/man/shortest.paths.Rd b/man/shortest.paths.Rd index f1d4343de3..45d8008ec6 100644 --- a/man/shortest.paths.Rd +++ b/man/shortest.paths.Rd @@ -54,4 +54,8 @@ used, regardless of this argument.} \code{shortest.paths()} was renamed to \code{\link[=distances]{distances()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/similarity.Rd b/man/similarity.Rd index 5f124a707b..37e6214c68 100644 --- a/man/similarity.Rd +++ b/man/similarity.Rd @@ -57,6 +57,10 @@ calculated. See the following paper for more details: Lada A. Adamic and Eytan Adar: Friends and neighbors on the Web. Social Networks, 25(3):211-230, 2003. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_dice}{\code{similarity_dice()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_inverse_log_weighted}{\code{similarity_inverse_log_weighted()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_jaccard}{\code{similarity_jaccard()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(5) @@ -78,5 +82,3 @@ Tamas Nepusz \email{ntamas@gmail.com} and Gabor Csardi \concept{cocitation} \concept{similarity} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_jaccard}{\code{similarity_jaccard()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_dice}{\code{similarity_dice()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_inverse_log_weighted}{\code{similarity_inverse_log_weighted()}}.} - diff --git a/man/similarity.dice.Rd b/man/similarity.dice.Rd index 371fcc4b07..fa9ef131d3 100644 --- a/man/similarity.dice.Rd +++ b/man/similarity.dice.Rd @@ -28,4 +28,8 @@ sets.} Please use \code{\link[=similarity]{similarity()}} with \code{method = "dice"} instead. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_dice}{\code{similarity_dice()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_inverse_log_weighted}{\code{similarity_inverse_log_weighted()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_jaccard}{\code{similarity_jaccard()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/similarity.invlogweighted.Rd b/man/similarity.invlogweighted.Rd index d10c4611bc..87dcee7530 100644 --- a/man/similarity.invlogweighted.Rd +++ b/man/similarity.invlogweighted.Rd @@ -24,4 +24,8 @@ possible values: \sQuote{\code{out}}, \sQuote{\verb{in}}, Please use \code{\link[=similarity]{similarity()}} with \code{method = "invlogweighted"} instead. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_dice}{\code{similarity_dice()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_inverse_log_weighted}{\code{similarity_inverse_log_weighted()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_jaccard}{\code{similarity_jaccard()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/similarity.jaccard.Rd b/man/similarity.jaccard.Rd index 78238766cb..312934dde4 100644 --- a/man/similarity.jaccard.Rd +++ b/man/similarity.jaccard.Rd @@ -28,4 +28,8 @@ sets.} Please use \code{\link[=similarity]{similarity()}} with \code{method = "jaccard"} instead. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_dice}{\code{similarity_dice()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_inverse_log_weighted}{\code{similarity_inverse_log_weighted()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_jaccard}{\code{similarity_jaccard()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/simple_cycles.Rd b/man/simple_cycles.Rd index 932b1c522b..a5884ab19a 100644 --- a/man/simple_cycles.Rd +++ b/man/simple_cycles.Rd @@ -37,6 +37,10 @@ Multi-edges and self-loops are taken into account. Note that typical graphs have exponentially many cycles and the presence of multi-edges exacerbates this combinatorial explosion. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_simple_cycles}{\code{simple_cycles()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- graph_from_literal(A -+ B -+ C -+ A -+ D -+ E +- F -+ A, E -+ E, A -+ F, simplify = FALSE) @@ -57,5 +61,3 @@ Graph cycles } \concept{cycles} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_simple_cycles}{\code{simple_cycles()}}.} - diff --git a/man/simplify.Rd b/man/simplify.Rd index 93a2ced2ce..a5f08a7e29 100644 --- a/man/simplify.Rd +++ b/man/simplify.Rd @@ -58,6 +58,10 @@ the VF2 isomorphism algorithm. Other graph, vertex and edge attributes from the original graph are discarded as the primary purpose of this function is to facilitate the usage of multigraphs with the VF2 algorithm. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_simple}{\code{is_simple()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_simplify_and_colorize}{\code{simplify_and_colorize()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_graph(c(1, 2, 1, 2, 3, 3)) @@ -104,5 +108,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} \concept{isomorphism} \concept{simple} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_simplify}{\code{simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_simple}{\code{is_simple()}}.} - diff --git a/man/sir.Rd b/man/sir.Rd index 9d765427c6..17d0ae4dac 100644 --- a/man/sir.Rd +++ b/man/sir.Rd @@ -104,6 +104,10 @@ Function \code{median} and \code{quantile} calculate the median and quantiles of the results, respectively, in bins calculated with \code{time_bins()}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Spatial-Games.html#igraph_sir}{\code{sir()}} +} + \examples{ g <- sample_gnm(100, 100) @@ -126,5 +130,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com}. Eric Kolaczyk } \concept{processes} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Spatial-Games.html#igraph_sir}{\code{sir()}}.} - diff --git a/man/spinglass.community.Rd b/man/spinglass.community.Rd index 9be9060522..69ef0a8ce3 100644 --- a/man/spinglass.community.Rd +++ b/man/spinglass.community.Rd @@ -90,4 +90,8 @@ is ignored if the \sQuote{orig} implementation is chosen.} \code{spinglass.community()} was renamed to \code{\link[=cluster_spinglass]{cluster_spinglass()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/split_join_distance.Rd b/man/split_join_distance.Rd index 09999e2771..23768396b0 100644 --- a/man/split_join_distance.Rd +++ b/man/split_join_distance.Rd @@ -35,6 +35,10 @@ partition from the first. This makes it easier to detect whether a partition is a subpartition of the other, since in this case, the corresponding distance will be zero. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Community.html#igraph_split_join_distance}{\code{split_join_distance()}} +} + \references{ van Dongen S: Performance criteria for graph clustering and Markov cluster experiments. Technical Report INS-R0012, National Research diff --git a/man/stCuts.Rd b/man/stCuts.Rd index 04a64ea8ac..4fdde908c7 100644 --- a/man/stCuts.Rd +++ b/man/stCuts.Rd @@ -19,4 +19,8 @@ stCuts(graph, source, target) \code{stCuts()} was renamed to \code{\link[=st_cuts]{st_cuts()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_all_st_cuts}{\code{all_st_cuts()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/stMincuts.Rd b/man/stMincuts.Rd index d37c925e69..33fe530941 100644 --- a/man/stMincuts.Rd +++ b/man/stMincuts.Rd @@ -25,4 +25,8 @@ here.} \code{stMincuts()} was renamed to \code{\link[=st_min_cuts]{st_min_cuts()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_all_st_mincuts}{\code{all_st_mincuts()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/st_cuts.Rd b/man/st_cuts.Rd index 82ac48b14e..4cf5a809a4 100644 --- a/man/st_cuts.Rd +++ b/man/st_cuts.Rd @@ -37,6 +37,10 @@ Given a \eqn{G} directed graph and two, different and non-ajacent vertices, removing these edges from \eqn{G} there is no directed path from \eqn{s} to \eqn{t}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_all_st_cuts}{\code{all_st_cuts()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # A very simple graph @@ -72,5 +76,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{flow} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_all_st_cuts}{\code{all_st_cuts()}}.} - diff --git a/man/st_min_cuts.Rd b/man/st_min_cuts.Rd index f636bbdbc5..6f59f647bf 100644 --- a/man/st_min_cuts.Rd +++ b/man/st_min_cuts.Rd @@ -53,6 +53,10 @@ simply the number of edges. An \eqn{(s,t)}-cut is minimum if it is of the smallest possible size. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_all_st_mincuts}{\code{all_st_mincuts()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # A difficult graph, from the Provan-Shier paper @@ -84,5 +88,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{flow} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_all_st_mincuts}{\code{all_st_mincuts()}}.} - diff --git a/man/static.fitness.game.Rd b/man/static.fitness.game.Rd index 1135ef69e3..0ae1a5f946 100644 --- a/man/static.fitness.game.Rd +++ b/man/static.fitness.game.Rd @@ -36,4 +36,8 @@ graph.} \code{static.fitness.game()} was renamed to \code{\link[=sample_fitness]{sample_fitness()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_static_fitness_game}{\code{static_fitness_game()}} +} + \keyword{internal} diff --git a/man/static.power.law.game.Rd b/man/static.power.law.game.Rd index bda9a14397..ae20cf0411 100644 --- a/man/static.power.law.game.Rd +++ b/man/static.power.law.game.Rd @@ -43,4 +43,8 @@ finite size correction of Cho et al., see references below.} \code{static.power.law.game()} was renamed to \code{\link[=sample_fitness_pl]{sample_fitness_pl()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_static_power_law_game}{\code{static_power_law_game()}} +} + \keyword{internal} diff --git a/man/stochastic_matrix.Rd b/man/stochastic_matrix.Rd index b61b5fd87c..14367664e5 100644 --- a/man/stochastic_matrix.Rd +++ b/man/stochastic_matrix.Rd @@ -35,6 +35,10 @@ The (row) stochastic matrix is defined as \deqn{W = D^{-1}M,}{W = inv(D) M,} where it is assumed that \eqn{D} is non-singular. Column stochastic matrices are defined in a symmetric way. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_stochastic}{\code{get_stochastic()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_stochastic_sparse}{\code{get_stochastic_sparse()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ library(Matrix) diff --git a/man/strength.Rd b/man/strength.Rd index 76a2e34f9b..c0b12f8f0c 100644 --- a/man/strength.Rd +++ b/man/strength.Rd @@ -35,6 +35,10 @@ A numeric vector giving the strength of the vertices. \description{ Summing up the edge weights of the adjacent edges for each vertex. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_strength}{\code{strength()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_star(10) @@ -74,5 +78,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{centrality} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_strength}{\code{strength()}}.} - diff --git a/man/subcomponent.Rd b/man/subcomponent.Rd index 128a85e74b..873e88b1bd 100644 --- a/man/subcomponent.Rd +++ b/man/subcomponent.Rd @@ -28,6 +28,10 @@ vertices from which a given vertex is reachable via a directed path. \details{ A breadth-first search is conducted starting from vertex \code{v}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_gnp(100, 1 / 200) diff --git a/man/subgraph.Rd b/man/subgraph.Rd index 36705561d5..4f3b3cc27a 100644 --- a/man/subgraph.Rd +++ b/man/subgraph.Rd @@ -57,6 +57,10 @@ The \code{subgraph()} function currently does the same as \code{induced_subgraph is deprecated. In the next major version, \code{subgraph()} will overtake the functionality of \code{subgraph_from_edges()}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_induced_subgraph}{\code{induced_subgraph()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_subgraph_from_edges}{\code{subgraph_from_edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_ring(10) diff --git a/man/subgraph.centrality.Rd b/man/subgraph.centrality.Rd index 7b0d2395e9..dac7918bc2 100644 --- a/man/subgraph.centrality.Rd +++ b/man/subgraph.centrality.Rd @@ -19,4 +19,8 @@ loops edges from the graph before the calculation.} \code{subgraph.centrality()} was renamed to \code{\link[=subgraph_centrality]{subgraph_centrality()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/subgraph.edges.Rd b/man/subgraph.edges.Rd index ccbf150d49..eb429cda9a 100644 --- a/man/subgraph.edges.Rd +++ b/man/subgraph.edges.Rd @@ -20,4 +20,8 @@ not have any adjacent edges in \code{eids}.} \code{subgraph.edges()} was renamed to \code{\link[=subgraph_from_edges]{subgraph_from_edges()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Operators.html#igraph_subgraph_from_edges}{\code{subgraph_from_edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/subgraph_centrality.Rd b/man/subgraph_centrality.Rd index 312356df6e..3847e8bea7 100644 --- a/man/subgraph_centrality.Rd +++ b/man/subgraph_centrality.Rd @@ -29,6 +29,10 @@ Currently the calculation is performed by explicitly calculating all eigenvalues and eigenvectors of the adjacency matrix of the graph. This effectively means that the measure can only be calculated for small graphs. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- sample_pa(100, m = 4, dir = FALSE) diff --git a/man/subgraph_isomorphic.Rd b/man/subgraph_isomorphic.Rd index 504ea47cfb..90c270a3ab 100644 --- a/man/subgraph_isomorphic.Rd +++ b/man/subgraph_isomorphic.Rd @@ -86,6 +86,10 @@ If you want to ignore these attributes, then supply \code{NULL} for both of thes } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_subisomorphic_vf2}{\code{subisomorphic_vf2()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ # A LAD example pattern <- make_graph( diff --git a/man/subgraph_isomorphisms.Rd b/man/subgraph_isomorphisms.Rd index 67f38b14d2..9eed6a1e53 100644 --- a/man/subgraph_isomorphisms.Rd +++ b/man/subgraph_isomorphisms.Rd @@ -71,6 +71,10 @@ If you want to ignore these attributes, then supply \code{NULL} for both of thes } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_get_subisomorphisms_vf2}{\code{get_subisomorphisms_vf2()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \seealso{ Other graph isomorphism: \code{\link{canonical_permutation}()}, diff --git a/man/tail_of.Rd b/man/tail_of.Rd index b2f2df6d99..2b2b509d9e 100644 --- a/man/tail_of.Rd +++ b/man/tail_of.Rd @@ -19,6 +19,10 @@ For undirected graphs, head and tail is not defined. In this case \code{tail_of()} returns vertices incident to the supplied edges, and \code{head_of()} returns the other end(s) of the edge(s). } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \seealso{ Other structural queries: \code{\link{[.igraph}()}, diff --git a/man/tkplot.Rd b/man/tkplot.Rd index 4ae97c0f87..4ba3324189 100644 --- a/man/tkplot.Rd +++ b/man/tkplot.Rd @@ -181,6 +181,10 @@ tkcreate(canvas, "text", width/2, 25, text="My title", } } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_is_directed}{\code{is_directed()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \seealso{ \code{\link[=plot.igraph]{plot.igraph()}}, \code{\link[=layout]{layout()}} } diff --git a/man/tkplot.center.Rd b/man/tkplot.center.Rd index 1aee681c18..bff6d63303 100644 --- a/man/tkplot.center.Rd +++ b/man/tkplot.center.Rd @@ -15,4 +15,8 @@ tkplot.center(tkp.id) \code{tkplot.center()} was renamed to \code{\link[=tk_center]{tk_center()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/tkplot.fit.to.screen.Rd b/man/tkplot.fit.to.screen.Rd index b15a6c39eb..fca7ea7fe9 100644 --- a/man/tkplot.fit.to.screen.Rd +++ b/man/tkplot.fit.to.screen.Rd @@ -19,4 +19,8 @@ tkplot.fit.to.screen(tkp.id, width = NULL, height = NULL) \code{tkplot.fit.to.screen()} was renamed to \code{\link[=tk_fit]{tk_fit()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/tkplot.reshape.Rd b/man/tkplot.reshape.Rd index 4a57a32510..3bd7396e86 100644 --- a/man/tkplot.reshape.Rd +++ b/man/tkplot.reshape.Rd @@ -22,4 +22,8 @@ the complete list.} \code{tkplot.reshape()} was renamed to \code{\link[=tk_reshape]{tk_reshape()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/tkplot.rotate.Rd b/man/tkplot.rotate.Rd index 982904597e..ad0fe31e19 100644 --- a/man/tkplot.rotate.Rd +++ b/man/tkplot.rotate.Rd @@ -19,4 +19,8 @@ tkplot.rotate(tkp.id, degree = NULL, rad = NULL) \code{tkplot.rotate()} was renamed to \code{\link[=tk_rotate]{tk_rotate()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/tkplot.setcoords.Rd b/man/tkplot.setcoords.Rd index 012beb47fc..6bd0f11964 100644 --- a/man/tkplot.setcoords.Rd +++ b/man/tkplot.setcoords.Rd @@ -18,4 +18,8 @@ vertices, in absolute coordinates.} \code{tkplot.setcoords()} was renamed to \code{\link[=tk_set_coords]{tk_set_coords()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/to_prufer.Rd b/man/to_prufer.Rd index 38d7ceee13..c8071efb57 100644 --- a/man/to_prufer.Rd +++ b/man/to_prufer.Rd @@ -23,6 +23,10 @@ find a vertex with degree one, remove it from the tree and add the label of the vertex that it was connected to to the sequence. Repeat until there are only two vertices in the remaining graph. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_to_prufer}{\code{to_prufer()}} +} + \examples{ g <- make_tree(13, 3) @@ -41,5 +45,3 @@ Other trees: } \concept{trees} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_to_prufer}{\code{to_prufer()}}.} - diff --git a/man/topo_sort.Rd b/man/topo_sort.Rd index 4d6cfb66c5..a48b7f7408 100644 --- a/man/topo_sort.Rd +++ b/man/topo_sort.Rd @@ -30,6 +30,10 @@ function returns a possible topological sort among them. If the graph is not acyclic (it has at least one cycle), a partial topological sort is returned and a warning is issued. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_topological_sorting}{\code{topological_sorting()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_pa(100) diff --git a/man/topological.sort.Rd b/man/topological.sort.Rd index b3b4c2effd..c69b3c54cd 100644 --- a/man/topological.sort.Rd +++ b/man/topological.sort.Rd @@ -21,4 +21,8 @@ nodes from which it receives edges. Nodes with no outgoing edges go first.} \code{topological.sort()} was renamed to \code{\link[=topo_sort]{topo_sort()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_topological_sorting}{\code{topological_sorting()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/transitive_closure.Rd b/man/transitive_closure.Rd index 01461959e4..0613bbdf4a 100644 --- a/man/transitive_closure.Rd +++ b/man/transitive_closure.Rd @@ -29,6 +29,10 @@ a directed path from \eqn{i} to \eqn{j}. For undirected graphs, this is equivalent to connecting all vertices that are in the same connected component. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_transitive_closure}{\code{transitive_closure()}} +} + \examples{ # Directed graph @@ -77,5 +81,3 @@ Fabio Zanini \email{fabio.zanini@unsw.edu.au} } \concept{functions for manipulating graph structure} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_transitive_closure}{\code{transitive_closure()}}.} - diff --git a/man/transitivity.Rd b/man/transitivity.Rd index 2c6800eda4..087f45fc09 100644 --- a/man/transitivity.Rd +++ b/man/transitivity.Rd @@ -102,6 +102,10 @@ The \code{barrat} type of transitivity does not work for graphs with multiple and/or loop edges. If you want to calculate it for a directed graph, call \code{\link[=as_undirected]{as_undirected()}} with the \code{collapse} mode first. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_transitivity_undirected}{\code{transitivity_undirected()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_transitivity_local_undirected}{\code{transitivity_local_undirected()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_transitivity_avglocal_undirected}{\code{transitivity_avglocal_undirected()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_transitivity_barrat}{\code{transitivity_barrat()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ g <- make_ring(10) diff --git a/man/triad.census.Rd b/man/triad.census.Rd index 111dbc34c7..6b0849f937 100644 --- a/man/triad.census.Rd +++ b/man/triad.census.Rd @@ -16,4 +16,8 @@ results a warning, and undefined results.} \code{triad.census()} was renamed to \code{\link[=triad_census]{triad_census()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_triad_census}{\code{triad_census()}} +} + \keyword{internal} diff --git a/man/triad_census.Rd b/man/triad_census.Rd index e7bd3b095e..f2f19a17ff 100644 --- a/man/triad_census.Rd +++ b/man/triad_census.Rd @@ -76,6 +76,10 @@ A<->B<->C, A<->C, the complete graph. This functions uses the RANDESU motif finder algorithm to find and count the subgraphs, see \code{\link[=motifs]{motifs()}}. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_triad_census}{\code{triad_census()}} +} + \examples{ g <- sample_gnm(15, 45, directed = TRUE) @@ -96,5 +100,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{motifs} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_triad_census}{\code{triad_census()}}.} - diff --git a/man/unfold.tree.Rd b/man/unfold.tree.Rd index 92e4f4533a..e1c0f58af3 100644 --- a/man/unfold.tree.Rd +++ b/man/unfold.tree.Rd @@ -23,4 +23,8 @@ search is performed. Typically it contains one vertex per component.} \code{unfold.tree()} was renamed to \code{\link[=unfold_tree]{unfold_tree()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_unfold_tree}{\code{unfold_tree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/unfold_tree.Rd b/man/unfold_tree.Rd index 88fef56131..f75711e973 100644 --- a/man/unfold_tree.Rd +++ b/man/unfold_tree.Rd @@ -38,6 +38,10 @@ A forest is a graph, whose components are trees. The \code{roots} vector can be calculated by simply doing a topological sort in all components of the graph, see the examples below. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_unfold_tree}{\code{unfold_tree()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_tree(10) \%du\% make_tree(10) diff --git a/man/union.igraph.Rd b/man/union.igraph.Rd index 750a4a904c..0d0bb7103e 100644 --- a/man/union.igraph.Rd +++ b/man/union.igraph.Rd @@ -44,6 +44,10 @@ present in all graphs, and it is not renamed in the result graph. An error is generated if some input graphs are directed and others are undirected. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Isomorphism.html#igraph_permute_vertices}{\code{permute_vertices()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \examples{ ## Union of two social networks with overlapping sets of actors diff --git a/man/upgrade_graph.Rd b/man/upgrade_graph.Rd index a633909d96..17bc1a34a1 100644 --- a/man/upgrade_graph.Rd +++ b/man/upgrade_graph.Rd @@ -25,6 +25,10 @@ or the data format of a possibly older igraph graph. \code{upgrade_graph()} can convert an older data format to the current one. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \seealso{ graph_version to check the current data format version or the version of a graph. diff --git a/man/vertex.connectivity.Rd b/man/vertex.connectivity.Rd index 2746f2f5f8..3e5ba1a2b3 100644 --- a/man/vertex.connectivity.Rd +++ b/man/vertex.connectivity.Rd @@ -27,4 +27,8 @@ thanks Peter.} \code{vertex.connectivity()} was renamed to \code{\link[=vertex_connectivity]{vertex_connectivity()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_vertex_connectivity}{\code{vertex_connectivity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/vertex.disjoint.paths.Rd b/man/vertex.disjoint.paths.Rd index 281fb3f879..a6c039b7cf 100644 --- a/man/vertex.disjoint.paths.Rd +++ b/man/vertex.disjoint.paths.Rd @@ -19,4 +19,8 @@ can be \code{NULL}, see details below.} \code{vertex.disjoint.paths()} was renamed to \code{\link[=vertex_disjoint_paths]{vertex_disjoint_paths()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/vertex_attr.Rd b/man/vertex_attr.Rd index bb8c9d76ef..52bdbab8e5 100644 --- a/man/vertex_attr.Rd +++ b/man/vertex_attr.Rd @@ -23,6 +23,10 @@ all vertex attributes, if \code{name} is missing. \description{ Query vertex attributes of a graph } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) \%>\% set_vertex_attr("color", value = "red") \%>\% diff --git a/man/vertex_connectivity.Rd b/man/vertex_connectivity.Rd index 8fb9f1c1e7..b5c6af8b6e 100644 --- a/man/vertex_connectivity.Rd +++ b/man/vertex_connectivity.Rd @@ -75,6 +75,10 @@ These three functions essentially calculate the same measure(s), more precisely \code{vertex_connectivity()} is the most general, the other two are included only for the ease of using more descriptive function names. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_vertex_connectivity}{\code{vertex_connectivity()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_cohesion}{\code{cohesion()}} +} + \examples{ g <- sample_pa(100, m = 1) diff --git a/man/voronoi_cells.Rd b/man/voronoi_cells.Rd index 5583e95d4e..8a858a44e3 100644 --- a/man/voronoi_cells.Rd +++ b/man/voronoi_cells.Rd @@ -56,6 +56,10 @@ it is closest. \code{\link[=groups]{groups()}} may be used on the output of this function. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_voronoi}{\code{voronoi()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_lattice(c(10, 10)) @@ -89,5 +93,3 @@ Community detection \code{\link{split_join_distance}()} } \concept{community} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_voronoi}{\code{voronoi()}}.} - diff --git a/man/walktrap.community.Rd b/man/walktrap.community.Rd index 940aa1f396..9c0ea66516 100644 --- a/man/walktrap.community.Rd +++ b/man/walktrap.community.Rd @@ -44,4 +44,8 @@ for the split corresponding to the highest modularity value.} \code{walktrap.community()} was renamed to \code{\link[=cluster_walktrap]{cluster_walktrap()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}} +} + \keyword{internal} diff --git a/man/weighted_cliques.Rd b/man/weighted_cliques.Rd index d3af9be317..3d17e309fe 100644 --- a/man/weighted_cliques.Rd +++ b/man/weighted_cliques.Rd @@ -54,6 +54,10 @@ weight is larger than the weight of this clique. \code{weighted_clique_num()} calculates the weight of the largest weighted clique(s). } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_weighted_cliques}{\code{weighted_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_graph("zachary") @@ -76,5 +80,3 @@ Tamas Nepusz \email{ntamas@gmail.com} and Gabor Csardi } \concept{cliques} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_weighted_cliques}{\code{weighted_cliques()}}.} - diff --git a/man/which_multiple.Rd b/man/which_multiple.Rd index 05f7f22c25..8fe9431738 100644 --- a/man/which_multiple.Rd +++ b/man/which_multiple.Rd @@ -61,6 +61,10 @@ graph then \code{which_multiple()} returns \code{TRUE} for only two of them whil See the examples for getting rid of multiple edges while keeping their original multiplicity as an edge attribute. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_multiple}{\code{is_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_multiple}{\code{has_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_count_multiple}{\code{count_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_loop}{\code{is_loop()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_loop}{\code{has_loop()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_count_loops}{\code{count_loops()}} +} + \examples{ # Loops @@ -123,5 +127,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_multiple}{\code{is_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_multiple}{\code{has_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_count_multiple}{\code{count_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_loop}{\code{is_loop()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_loop}{\code{has_loop()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_count_loops}{\code{count_loops()}}.} - diff --git a/man/which_mutual.Rd b/man/which_mutual.Rd index 9acbed38d8..426acbd0aa 100644 --- a/man/which_mutual.Rd +++ b/man/which_mutual.Rd @@ -30,6 +30,10 @@ considered to be mutual. Undirected graphs contain only mutual edges by definition. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_mutual}{\code{is_mutual()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- sample_gnm(10, 50, directed = TRUE) @@ -73,5 +77,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{structural.properties} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_mutual}{\code{is_mutual()}}.} - diff --git a/man/write.graph.Rd b/man/write.graph.Rd index 42637c42a6..eabcf4c641 100644 --- a/man/write.graph.Rd +++ b/man/write.graph.Rd @@ -31,4 +31,8 @@ this argument is case insensitive.} \code{write.graph()} was renamed to \code{\link[=write_graph]{write_graph()}} to create a more consistent API. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_edgelist}{\code{write_graph_edgelist()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_pajek}{\code{write_graph_pajek()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_graphml}{\code{write_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_gml}{\code{write_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_dot}{\code{write_graph_dot()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_leda}{\code{write_graph_leda()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \keyword{internal} diff --git a/man/write_graph.Rd b/man/write_graph.Rd index a06166b181..a836c88ca1 100644 --- a/man/write_graph.Rd +++ b/man/write_graph.Rd @@ -140,6 +140,10 @@ This format is meant solely for interoperability with Graphviz. It is not recomm data exchange or archival. } +\section{Related documentation in the C library}{ +\href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_edgelist}{\code{write_graph_edgelist()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_pajek}{\code{write_graph_pajek()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_graphml}{\code{write_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_gml}{\code{write_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_dot}{\code{write_graph_dot()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_leda}{\code{write_graph_leda()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_edges}{\code{edges()}}, \href{https://igraph.org/c/html/latest/igraph-Basic.html#igraph_vcount}{\code{vcount()}} +} + \examples{ g <- make_ring(10) @@ -167,5 +171,3 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{foreign} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_dimacs_flow}{\code{write_graph_dimacs_flow()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_dot}{\code{write_graph_dot()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_edgelist}{\code{write_graph_edgelist()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_gml}{\code{write_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_graphml}{\code{write_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_leda}{\code{write_graph_leda()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_lgl}{\code{write_graph_lgl()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_ncol}{\code{write_graph_ncol()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_pajek}{\code{write_graph_pajek()}}.} -