diff --git a/R/centrality.R b/R/centrality.R index 50a6ccbd70..c311b4f11f 100644 --- a/R/centrality.R +++ b/R/centrality.R @@ -668,19 +668,26 @@ arpack_defaults <- function() { #' #' ## First three eigenvalues of the adjacency matrix of a graph #' ## We need the 'Matrix' package for this -#' if (require(Matrix)) { -#' set.seed(42) -#' g <- sample_gnp(1000, 5 / 1000) -#' M <- as_adjacency_matrix(g, sparse = TRUE) -#' f2 <- function(x, extra = NULL) { -#' cat(".") -#' as.vector(M %*% x) -#' } -#' baev <- arpack(f2, sym = TRUE, options = list( -#' n = vcount(g), nev = 3, ncv = 8, -#' which = "LM", maxiter = 2000 -#' )) +#' @examplesIf rlang::is_installed("Matrix") +#' library("Matrix") +#' set.seed(42) +#' g <- sample_gnp(1000, 5 / 1000) +#' M <- as_adjacency_matrix(g, sparse = TRUE) +#' f2 <- function(x, extra = NULL) { +#' cat(".") +#' as.vector(M %*% x) #' } +#' baev <- arpack( +#' f2, +#' sym = TRUE, +#' options = list( +#' n = vcount(g), +#' nev = 3, +#' ncv = 8, +#' which = "LM", +#' maxiter = 2000 +#' ) +#' ) #' @family arpack #' @export arpack <- function(func, extra = NULL, sym = FALSE, options = arpack_defaults(), diff --git a/R/demo.R b/R/demo.R index 268a1d5776..f1fee96a56 100644 --- a/R/demo.R +++ b/R/demo.R @@ -58,9 +58,9 @@ igraphdemo <- function(which) { # nocov start #' @examples #' #' igraph_demo() -#' if (interactive() && requireNamespace("tcltk", quietly = TRUE)) { -#' igraph_demo("centrality") -#' } +#' +#' @examplesIf interactive() && rlang::is_installed("tcltk") +#' igraph_demo("centrality") #' igraph_demo <- function(which) { if (missing(which)) { diff --git a/R/games.R b/R/games.R index 29ba7631a3..c9d73694df 100644 --- a/R/games.R +++ b/R/games.R @@ -1877,9 +1877,10 @@ sbm <- function(...) constructor_spec(sample_sbm, ...) #' ), nrow = 3) #' g <- sample_hierarchical_sbm(100, 10, rho = c(3, 3, 4) / 10, C = C, p = 1 / 20) #' g -#' if (require(Matrix)) { -#' image(g[]) -#' } +#' +#' @examplesIf rlang::is_installed("Matrix") +#' library("Matrix") +#' image(g[]) #' @family games #' @export #' @cdocs igraph_hsbm_game diff --git a/R/plot.R b/R/plot.R index 8ab66af44c..47fda36580 100644 --- a/R/plot.R +++ b/R/plot.R @@ -527,9 +527,9 @@ plot.igraph <- function(x, #' #' g <- make_lattice(c(5, 5, 5)) #' coords <- layout_with_fr(g, dim = 3) -#' if (interactive() && requireNamespace("rgl", quietly = TRUE)) { -#' rglplot(g, layout = coords) -#' } +#' +#' @examplesIf interactive() && rlang::is_installed("rgl") +#' rglplot(g, layout = coords) #' rglplot <- function(x, ...) { UseMethod("rglplot", x) diff --git a/R/plot.common.R b/R/plot.common.R index c163d582e2..32092260aa 100644 --- a/R/plot.common.R +++ b/R/plot.common.R @@ -1440,14 +1440,12 @@ i.default.values[["plot"]] <- i.plot.default #' @examples #' #' g <- make_ring(10) -#' values <- lapply(1:10, function(x) sample(1:10, 3)) -#' if (interactive()) { -#' plot(g, -#' vertex.shape = "pie", vertex.pie = values, -#' vertex.pie.color = list(heat.colors(5)), -#' vertex.size = seq(10, 30, length.out = 10), vertex.label = NA -#' ) -#' } +#' values <- lapply(1:10, function(x) sample(1:10,3)) +#' +#' @examplesIf interactive() +#' plot(g, vertex.shape = "pie", vertex.pie = values, +#' vertex.pie.color = list(heat.colors(5)), +#' vertex.size = seq(10, 30, length.out = 10), vertex.label = NA) #' @rdname vertex.shape.pie #' @name vertex.shape.pie NULL diff --git a/man/are_adjacent.Rd b/man/are_adjacent.Rd index 56843838e5..8a57057f4e 100644 --- a/man/are_adjacent.Rd +++ b/man/are_adjacent.Rd @@ -48,5 +48,5 @@ 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{igraph_are_adjacent()}}.} +\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/arpack.Rd b/man/arpack.Rd index 61144d785e..c40012e669 100644 --- a/man/arpack.Rd +++ b/man/arpack.Rd @@ -181,19 +181,27 @@ eigen(laplacian_matrix(make_star(10, mode = "undirected"))) ## First three eigenvalues of the adjacency matrix of a graph ## We need the 'Matrix' package for this -if (require(Matrix)) { - set.seed(42) - g <- sample_gnp(1000, 5 / 1000) - M <- as_adjacency_matrix(g, sparse = TRUE) - f2 <- function(x, extra = NULL) { - cat(".") - as.vector(M \%*\% x) - } - baev <- arpack(f2, sym = TRUE, options = list( - n = vcount(g), nev = 3, ncv = 8, - which = "LM", maxiter = 2000 - )) +\dontshow{if (rlang::is_installed("Matrix")) withAutoprint(\{ # examplesIf} +library("Matrix") +set.seed(42) +g <- sample_gnp(1000, 5 / 1000) +M <- as_adjacency_matrix(g, sparse = TRUE) +f2 <- function(x, extra = NULL) { + cat(".") + as.vector(M \%*\% x) } +baev <- arpack( + f2, + sym = TRUE, + options = list( + n = vcount(g), + nev = 3, + ncv = 8, + which = "LM", + maxiter = 2000 + ) +) +\dontshow{\}) # examplesIf} } \references{ D.C. Sorensen, Implicit Application of Polynomial Filters in a diff --git a/man/articulation_points.Rd b/man/articulation_points.Rd index 124b1d6bd0..91016495cc 100644 --- a/man/articulation_points.Rd +++ b/man/articulation_points.Rd @@ -57,5 +57,5 @@ 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{igraph_articulation_points()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_bridges}{\code{igraph_bridges()}}.} +\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 e8a1ee31ba..729363ba44 100644 --- a/man/as_directed.Rd +++ b/man/as_directed.Rd @@ -118,5 +118,5 @@ 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{igraph_to_directed()}}.} +\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/assortativity.Rd b/man/assortativity.Rd index 303326ef57..038771a866 100644 --- a/man/assortativity.Rd +++ b/man/assortativity.Rd @@ -126,5 +126,5 @@ 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{igraph_assortativity()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity_nominal}{\code{igraph_assortativity_nominal()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_assortativity_degree}{\code{igraph_assortativity_degree()}}.} +\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/automorphism_group.Rd b/man/automorphism_group.Rd index 7ac6ea08dd..b6c9c94f2d 100644 --- a/man/automorphism_group.Rd +++ b/man/automorphism_group.Rd @@ -83,5 +83,5 @@ 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{igraph_automorphism_group()}}.} +\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/biconnected_components.Rd b/man/biconnected_components.Rd index b69f2fbe7b..6abf99f79d 100644 --- a/man/biconnected_components.Rd +++ b/man/biconnected_components.Rd @@ -56,5 +56,5 @@ 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{igraph_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()}}.} diff --git a/man/bipartite_mapping.Rd b/man/bipartite_mapping.Rd index c6974de72f..785a030484 100644 --- a/man/bipartite_mapping.Rd +++ b/man/bipartite_mapping.Rd @@ -61,5 +61,5 @@ 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{igraph_is_bipartite()}}.} +\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 6c15c2270c..7dbc2a65cc 100644 --- a/man/bipartite_projection.Rd +++ b/man/bipartite_projection.Rd @@ -100,5 +100,5 @@ 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{igraph_bipartite_projection_size()}}.} +\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/canonical_permutation.Rd b/man/canonical_permutation.Rd index 9da7fe458c..70840add23 100644 --- a/man/canonical_permutation.Rd +++ b/man/canonical_permutation.Rd @@ -105,5 +105,5 @@ 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{igraph_canonical_permutation()}}.} +\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_tmax.Rd b/man/centr_betw_tmax.Rd index 9ec4170e22..8341178531 100644 --- a/man/centr_betw_tmax.Rd +++ b/man/centr_betw_tmax.Rd @@ -44,5 +44,5 @@ 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{igraph_centralization_betweenness_tmax()}}.} +\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 085dc9e662..378ea6d324 100644 --- a/man/centr_clo.Rd +++ b/man/centr_clo.Rd @@ -47,5 +47,5 @@ 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{igraph_centralization_closeness()}}.} +\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 1f047ff9cf..91abfd3e69 100644 --- a/man/centr_clo_tmax.Rd +++ b/man/centr_clo_tmax.Rd @@ -43,5 +43,5 @@ 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{igraph_centralization_closeness_tmax()}}.} +\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 e7189a6b98..1ed1d52ac8 100644 --- a/man/centr_degree.Rd +++ b/man/centr_degree.Rd @@ -55,5 +55,5 @@ 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{igraph_centralization_degree()}}.} +\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_eigen.Rd b/man/centr_eigen.Rd index f3efd32294..9f29386284 100644 --- a/man/centr_eigen.Rd +++ b/man/centr_eigen.Rd @@ -66,5 +66,5 @@ 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{igraph_centralization_eigenvector_centrality()}}.} +\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 a1e2760bfa..bc52861c31 100644 --- a/man/centr_eigen_tmax.Rd +++ b/man/centr_eigen_tmax.Rd @@ -46,5 +46,5 @@ 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{igraph_centralization_eigenvector_centrality_tmax()}}.} +\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/centralize.Rd b/man/centralize.Rd index 1006078021..134db123a5 100644 --- a/man/centralize.Rd +++ b/man/centralize.Rd @@ -84,5 +84,5 @@ 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{igraph_centralization()}}.} +\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/cliques.Rd b/man/cliques.Rd index 4f422b38d8..278ca80583 100644 --- a/man/cliques.Rd +++ b/man/cliques.Rd @@ -125,5 +125,5 @@ 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{igraph_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_cliques}{\code{igraph_largest_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_clique_number}{\code{igraph_clique_number()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_largest_weighted_cliques}{\code{igraph_largest_weighted_cliques()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_weighted_clique_number}{\code{igraph_weighted_clique_number()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_maximal_cliques_hist}{\code{igraph_maximal_cliques_hist()}}, \href{https://igraph.org/c/html/latest/igraph-Cliques.html#igraph_clique_size_hist}{\code{igraph_clique_size_hist()}}.} +\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()}}.} diff --git a/man/components.Rd b/man/components.Rd index 9db9505734..05bf72cbcc 100644 --- a/man/components.Rd +++ b/man/components.Rd @@ -123,5 +123,5 @@ 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{igraph_is_connected()}}.} +\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/consensus_tree.Rd b/man/consensus_tree.Rd index be44cf9160..fc0442cae1 100644 --- a/man/consensus_tree.Rd +++ b/man/consensus_tree.Rd @@ -52,5 +52,5 @@ 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{igraph_hrg_consensus()}}.} +\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/contract.Rd b/man/contract.Rd index 9b4ca036d9..e76972702a 100644 --- a/man/contract.Rd +++ b/man/contract.Rd @@ -75,5 +75,5 @@ 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{igraph_contract_vertices()}}.} +\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/convex_hull.Rd b/man/convex_hull.Rd index bf7d0e29ff..4c244221cb 100644 --- a/man/convex_hull.Rd +++ b/man/convex_hull.Rd @@ -39,5 +39,5 @@ 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{igraph_convex_hull()}}.} +\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/count_automorphisms.Rd b/man/count_automorphisms.Rd index 89b5ce7fa9..4726b01170 100644 --- a/man/count_automorphisms.Rd +++ b/man/count_automorphisms.Rd @@ -84,5 +84,5 @@ 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{igraph_count_automorphisms()}}.} +\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_triangles.Rd b/man/count_triangles.Rd index bb84c388c5..8db87f9e93 100644 --- a/man/count_triangles.Rd +++ b/man/count_triangles.Rd @@ -63,5 +63,5 @@ 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{igraph_list_triangles()}}, \href{https://igraph.org/c/html/latest/igraph-Motifs.html#igraph_adjacent_triangles}{\code{igraph_adjacent_triangles()}}.} +\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/degree.Rd b/man/degree.Rd index 6292374fc2..e608495a43 100644 --- a/man/degree.Rd +++ b/man/degree.Rd @@ -100,5 +100,5 @@ 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{igraph_maxdegree()}}.} +\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_maxdegree}{\code{maxdegree()}}.} diff --git a/man/dim_select.Rd b/man/dim_select.Rd index 7752d085a4..bbaa569d30 100644 --- a/man/dim_select.Rd +++ b/man/dim_select.Rd @@ -78,5 +78,5 @@ 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{igraph_dim_select()}}.} +\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/distances.Rd b/man/distances.Rd index 36a86e62dd..4eb66a1036 100644 --- a/man/distances.Rd +++ b/man/distances.Rd @@ -301,5 +301,5 @@ 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{igraph_path_length_hist()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_average_path_length_dijkstra}{\code{igraph_average_path_length_dijkstra()}}.} +\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 5d11096e80..570b68a7de 100644 --- a/man/diversity.Rd +++ b/man/diversity.Rd @@ -71,5 +71,5 @@ 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{igraph_diversity()}}.} +\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/dyad_census.Rd b/man/dyad_census.Rd index fc52460a56..4f6ef6186f 100644 --- a/man/dyad_census.Rd +++ b/man/dyad_census.Rd @@ -47,5 +47,5 @@ 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{igraph_dyad_census()}}.} +\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 6534da42be..a4678a78d2 100644 --- a/man/eccentricity.Rd +++ b/man/eccentricity.Rd @@ -68,5 +68,5 @@ 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{igraph_eccentricity_dijkstra()}}.} +\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_density.Rd b/man/edge_density.Rd index ddbaf008e5..6f70664849 100644 --- a/man/edge_density.Rd +++ b/man/edge_density.Rd @@ -79,5 +79,5 @@ 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{igraph_density()}}.} +\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/eigen_centrality.Rd b/man/eigen_centrality.Rd index 6945c2bd97..9901e4f54e 100644 --- a/man/eigen_centrality.Rd +++ b/man/eigen_centrality.Rd @@ -122,5 +122,5 @@ 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{igraph_eigenvector_centrality()}}.} +\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 6bb0d299d8..edb0a9dba8 100644 --- a/man/embed_adjacency_matrix.Rd +++ b/man/embed_adjacency_matrix.Rd @@ -100,5 +100,5 @@ 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{igraph_adjacency_spectral_embedding()}}.} +\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 89672f6623..885202c372 100644 --- a/man/embed_laplacian_matrix.Rd +++ b/man/embed_laplacian_matrix.Rd @@ -110,5 +110,5 @@ 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{igraph_laplacian_spectral_embedding()}}.} +\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/feedback_arc_set.Rd b/man/feedback_arc_set.Rd index fdc6fae4b1..557908d4ad 100644 --- a/man/feedback_arc_set.Rd +++ b/man/feedback_arc_set.Rd @@ -84,5 +84,5 @@ 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{igraph_feedback_arc_set()}}.} +\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/global_efficiency.Rd b/man/global_efficiency.Rd index 3e9758e8bc..c2bff5b8b6 100644 --- a/man/global_efficiency.Rd +++ b/man/global_efficiency.Rd @@ -104,5 +104,5 @@ 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{igraph_global_efficiency()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_local_efficiency}{\code{igraph_local_efficiency()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_average_local_efficiency}{\code{igraph_average_local_efficiency()}}.} +\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 407d273fd0..afe05c576a 100644 --- a/man/gorder.Rd +++ b/man/gorder.Rd @@ -40,5 +40,5 @@ 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{igraph_vcount()}}.} +\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.lattice.Rd b/man/graph.lattice.Rd index a7b0ed502f..0435ebc746 100644 --- a/man/graph.lattice.Rd +++ b/man/graph.lattice.Rd @@ -45,5 +45,5 @@ be extended to boolean vector with dimvector length.} 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{igraph_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()}}.} diff --git a/man/graph_center.Rd b/man/graph_center.Rd index 92ff4cac8d..edaa1075a6 100644 --- a/man/graph_center.Rd +++ b/man/graph_center.Rd @@ -57,5 +57,5 @@ 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{igraph_graph_center_dijkstra()}}.} +\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 0ef1bd43ba..f3881bdf42 100644 --- a/man/graph_from_adj_list.Rd +++ b/man/graph_from_adj_list.Rd @@ -82,5 +82,5 @@ 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{igraph_adjlist()}}.} +\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_isomorphism_class.Rd b/man/graph_from_isomorphism_class.Rd index 554e7ffe69..0a74cf482b 100644 --- a/man/graph_from_isomorphism_class.Rd +++ b/man/graph_from_isomorphism_class.Rd @@ -36,5 +36,5 @@ 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{igraph_isoclass_create()}}.} +\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 f5c52bef2b..2ae9978e59 100644 --- a/man/graph_from_lcf.Rd +++ b/man/graph_from_lcf.Rd @@ -39,5 +39,5 @@ 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{igraph_lcf_vector()}}.} +\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/graphlet_basis.Rd b/man/graphlet_basis.Rd index 2cf18b2cc6..4971d8fa66 100644 --- a/man/graphlet_basis.Rd +++ b/man/graphlet_basis.Rd @@ -103,5 +103,5 @@ 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{igraph_graphlets()}}.} +\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/greedy_vertex_coloring.Rd b/man/greedy_vertex_coloring.Rd index d6cf2ad508..234169f164 100644 --- a/man/greedy_vertex_coloring.Rd +++ b/man/greedy_vertex_coloring.Rd @@ -42,5 +42,5 @@ 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{igraph_vertex_coloring_greedy()}}.} +\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/harmonic_centrality.Rd b/man/harmonic_centrality.Rd index d6f7944add..c70629c847 100644 --- a/man/harmonic_centrality.Rd +++ b/man/harmonic_centrality.Rd @@ -85,5 +85,5 @@ 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{igraph_harmonic_centrality_cutoff()}}.} +\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_eulerian_path.Rd b/man/has_eulerian_path.Rd index 275cf63241..43e350f683 100644 --- a/man/has_eulerian_path.Rd +++ b/man/has_eulerian_path.Rd @@ -65,5 +65,5 @@ 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{igraph_is_eulerian()}}, \href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_eulerian_path}{\code{igraph_eulerian_path()}}, \href{https://igraph.org/c/html/latest/igraph-Cycles.html#igraph_eulerian_cycle}{\code{igraph_eulerian_cycle()}}.} +\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/hits_scores.Rd b/man/hits_scores.Rd index f216a6ab66..021af81558 100644 --- a/man/hits_scores.Rd +++ b/man/hits_scores.Rd @@ -89,5 +89,5 @@ 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{igraph_hub_and_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()}}.} diff --git a/man/hrg.Rd b/man/hrg.Rd index 587a07bf52..4eff251cef 100644 --- a/man/hrg.Rd +++ b/man/hrg.Rd @@ -33,5 +33,5 @@ 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{igraph_hrg_create()}}.} +\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_tree.Rd b/man/hrg_tree.Rd index 212f961e04..e3dcca5003 100644 --- a/man/hrg_tree.Rd +++ b/man/hrg_tree.Rd @@ -28,5 +28,5 @@ 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{igraph_from_hrg_dendrogram()}}.} +\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/igraph_demo.Rd b/man/igraph_demo.Rd index 0648d23d88..765ad6c762 100644 --- a/man/igraph_demo.Rd +++ b/man/igraph_demo.Rd @@ -28,10 +28,10 @@ The \code{tcltk} package is needed for \code{igraph_demo()}. \examples{ igraph_demo() -if (interactive() && requireNamespace("tcltk", quietly = TRUE)) { - igraph_demo("centrality") -} +\dontshow{if (interactive() && rlang::is_installed("tcltk")) withAutoprint(\{ # examplesIf} +igraph_demo("centrality") +\dontshow{\}) # examplesIf} } \seealso{ \code{\link[=demo]{demo()}} diff --git a/man/is_acyclic.Rd b/man/is_acyclic.Rd index a5e1fbe0f9..bd17bf4e11 100644 --- a/man/is_acyclic.Rd +++ b/man/is_acyclic.Rd @@ -63,5 +63,5 @@ 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{igraph_is_acyclic()}}.} +\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 537d064a25..16f847b1ba 100644 --- a/man/is_biconnected.Rd +++ b/man/is_biconnected.Rd @@ -44,5 +44,5 @@ 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{igraph_is_biconnected()}}.} +\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_dag.Rd b/man/is_dag.Rd index 8391020f74..48779ade50 100644 --- a/man/is_dag.Rd +++ b/man/is_dag.Rd @@ -67,5 +67,5 @@ 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{igraph_is_dag()}}.} +\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_forest.Rd b/man/is_forest.Rd index 9c8f9419a5..bfe6958931 100644 --- a/man/is_forest.Rd +++ b/man/is_forest.Rd @@ -54,5 +54,5 @@ 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{igraph_is_forest()}}.} +\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 7668903810..6c10001c9b 100644 --- a/man/is_graphical.Rd +++ b/man/is_graphical.Rd @@ -58,5 +58,5 @@ 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{igraph_is_graphical()}}.} +\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 15578afaf3..69bc91bdcd 100644 --- a/man/is_min_separator.Rd +++ b/man/is_min_separator.Rd @@ -69,5 +69,5 @@ 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{igraph_is_minimal_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()}}.} diff --git a/man/is_separator.Rd b/man/is_separator.Rd index 49ff54ed39..6906cf8fba 100644 --- a/man/is_separator.Rd +++ b/man/is_separator.Rd @@ -48,5 +48,5 @@ 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{igraph_is_separator()}}.} +\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 22a52ecf6a..cca88079f4 100644 --- a/man/is_tree.Rd +++ b/man/is_tree.Rd @@ -56,5 +56,5 @@ 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{igraph_is_tree()}}.} +\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/k_shortest_paths.Rd b/man/k_shortest_paths.Rd index 089d446917..89609ee57c 100644 --- a/man/k_shortest_paths.Rd +++ b/man/k_shortest_paths.Rd @@ -86,5 +86,5 @@ 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{igraph_get_k_shortest_paths()}}.} +\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 e3d3a6ab4f..c33aff1bb3 100644 --- a/man/knn.Rd +++ b/man/knn.Rd @@ -119,5 +119,5 @@ 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{igraph_avg_nearest_neighbor_degree()}}.} +\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/laplacian_matrix.Rd b/man/laplacian_matrix.Rd index 4acb77d62b..098e055350 100644 --- a/man/laplacian_matrix.Rd +++ b/man/laplacian_matrix.Rd @@ -77,5 +77,5 @@ 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_sparse}{\code{igraph_get_laplacian_sparse()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_get_laplacian}{\code{igraph_get_laplacian()}}.} +\section{Related documentation in the C library}{\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-Structural.html#igraph_get_laplacian}{\code{get_laplacian()}}.} diff --git a/man/make_empty_graph.Rd b/man/make_empty_graph.Rd index d808898967..030f1ed1b9 100644 --- a/man/make_empty_graph.Rd +++ b/man/make_empty_graph.Rd @@ -43,5 +43,5 @@ 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{igraph_empty()}}.} +\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 fd12f3af6e..6a1680bc05 100644 --- a/man/make_from_prufer.Rd +++ b/man/make_from_prufer.Rd @@ -44,5 +44,5 @@ 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{igraph_from_prufer()}}.} +\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_lattice.Rd b/man/make_lattice.Rd index 2f34295303..52e2dfe39c 100644 --- a/man/make_lattice.Rd +++ b/man/make_lattice.Rd @@ -74,5 +74,5 @@ Other deterministic constructors: } \concept{Lattice} \concept{deterministic constructors} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_square_lattice}{\code{igraph_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()}}.} diff --git a/man/max_cardinality.Rd b/man/max_cardinality.Rd index 4f7150b300..1dde1ac3e2 100644 --- a/man/max_cardinality.Rd +++ b/man/max_cardinality.Rd @@ -66,5 +66,5 @@ Gabor Csardi \email{csardi.gabor@gmail.com} } \concept{chordal} \keyword{graphs} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_maximum_cardinality_search}{\code{igraph_maximum_cardinality_search()}}.} +\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_maximum_cardinality_search}{\code{maximum_cardinality_search()}}.} diff --git a/man/max_flow.Rd b/man/max_flow.Rd index 7b6c009a9c..9ab924d0ef 100644 --- a/man/max_flow.Rd +++ b/man/max_flow.Rd @@ -84,5 +84,5 @@ Other flow: \code{\link{vertex_connectivity}()} } \concept{flow} -\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_maxflow}{\code{igraph_maxflow()}}.} +\section{Related documentation in the C library}{\href{https://igraph.org/c/html/latest/igraph-Flows.html#igraph_maxflow}{\code{maxflow()}}.} diff --git a/man/min_separators.Rd b/man/min_separators.Rd index f14d553a53..98820f46df 100644 --- a/man/min_separators.Rd +++ b/man/min_separators.Rd @@ -92,5 +92,5 @@ 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_minimum_size_separators}{\code{igraph_minimum_size_separators()}}.} +\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()}}.} diff --git a/man/min_st_separators.Rd b/man/min_st_separators.Rd index be4938da3f..6a1924654d 100644 --- a/man/min_st_separators.Rd +++ b/man/min_st_separators.Rd @@ -84,5 +84,5 @@ 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{igraph_all_minimal_st_separators()}}.} +\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/page_rank.Rd b/man/page_rank.Rd index 0f14a4960f..ca6089e242 100644 --- a/man/page_rank.Rd +++ b/man/page_rank.Rd @@ -128,5 +128,5 @@ 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{igraph_personalized_pagerank()}}.} +\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/permute.Rd b/man/permute.Rd index ee3c3fda3c..2dab221f42 100644 --- a/man/permute.Rd +++ b/man/permute.Rd @@ -78,5 +78,5 @@ 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{igraph_permute_vertices()}}.} +\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/radius.Rd b/man/radius.Rd index c090f1fa3f..16cb54ccbe 100644 --- a/man/radius.Rd +++ b/man/radius.Rd @@ -61,5 +61,5 @@ 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{igraph_radius_dijkstra()}}.} +\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 c08ab2f928..22105a3c22 100644 --- a/man/random_walk.Rd +++ b/man/random_walk.Rd @@ -81,5 +81,5 @@ 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{igraph_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 eec410f9ff..ddbf15b9ca 100644 --- a/man/read_graph.Rd +++ b/man/read_graph.Rd @@ -102,5 +102,5 @@ 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{igraph_read_graph_dimacs_flow()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_dl}{\code{igraph_read_graph_dl()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_edgelist}{\code{igraph_read_graph_edgelist()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_gml}{\code{igraph_read_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphdb}{\code{igraph_read_graph_graphdb()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_graphml}{\code{igraph_read_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_lgl}{\code{igraph_read_graph_lgl()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_ncol}{\code{igraph_read_graph_ncol()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_read_graph_pajek}{\code{igraph_read_graph_pajek()}}.} +\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 3ffc5e60ce..873e9d12c0 100644 --- a/man/realize_bipartite_degseq.Rd +++ b/man/realize_bipartite_degseq.Rd @@ -60,5 +60,5 @@ 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{igraph_realize_bipartite_degree_sequence()}}.} +\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 7ddbaca212..8b2e2fcad2 100644 --- a/man/realize_degseq.Rd +++ b/man/realize_degseq.Rd @@ -111,5 +111,5 @@ 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{igraph_realize_degree_sequence()}}.} +\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 4563ab737c..b43cf3f63e 100644 --- a/man/reciprocity.Rd +++ b/man/reciprocity.Rd @@ -73,5 +73,5 @@ 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{igraph_reciprocity()}}.} +\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/reverse_edges.Rd b/man/reverse_edges.Rd index eafbb43625..c4afc1e66c 100644 --- a/man/reverse_edges.Rd +++ b/man/reverse_edges.Rd @@ -58,5 +58,5 @@ 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{igraph_reverse_edges()}}.} +\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 937b95bfcb..3a07886364 100644 --- a/man/rglplot.Rd +++ b/man/rglplot.Rd @@ -30,10 +30,10 @@ arguments. g <- make_lattice(c(5, 5, 5)) coords <- layout_with_fr(g, dim = 3) -if (interactive() && requireNamespace("rgl", quietly = TRUE)) { - rglplot(g, layout = coords) -} +\dontshow{if (interactive() && rlang::is_installed("rgl")) withAutoprint(\{ # examplesIf} +rglplot(g, layout = coords) +\dontshow{\}) # examplesIf} } \seealso{ \link{igraph.plotting}, \code{\link[=plot.igraph]{plot.igraph()}} for the 2D diff --git a/man/sample_chung_lu.Rd b/man/sample_chung_lu.Rd index d69ed3b4d4..58ac5621ce 100644 --- a/man/sample_chung_lu.Rd +++ b/man/sample_chung_lu.Rd @@ -195,5 +195,5 @@ 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{igraph_chung_lu_game()}}.} +\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 c180df2459..3b23c128e7 100644 --- a/man/sample_correlated_gnp.Rd +++ b/man/sample_correlated_gnp.Rd @@ -83,5 +83,5 @@ 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{igraph_correlated_game()}}.} +\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 473733336a..92e6f9faab 100644 --- a/man/sample_correlated_gnp_pair.Rd +++ b/man/sample_correlated_gnp_pair.Rd @@ -77,5 +77,5 @@ 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{igraph_correlated_pair_game()}}.} +\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_dot_product.Rd b/man/sample_dot_product.Rd index e84b56a390..8aae17e71c 100644 --- a/man/sample_dot_product.Rd +++ b/man/sample_dot_product.Rd @@ -88,5 +88,5 @@ 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{igraph_dot_product_game()}}.} +\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 f6ab1840d9..d70cfe29ef 100644 --- a/man/sample_fitness.Rd +++ b/man/sample_fitness.Rd @@ -110,5 +110,5 @@ 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{igraph_static_fitness_game()}}.} +\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 3e092097d3..003925c2c7 100644 --- a/man/sample_fitness_pl.Rd +++ b/man/sample_fitness_pl.Rd @@ -119,5 +119,5 @@ 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{igraph_static_power_law_game()}}.} +\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 6d44e99b1e..25377167d3 100644 --- a/man/sample_forestfire.Rd +++ b/man/sample_forestfire.Rd @@ -108,5 +108,5 @@ 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{igraph_forest_fire_game()}}.} +\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_growing.Rd b/man/sample_growing.Rd index 7621ede2b1..c83cb59de3 100644 --- a/man/sample_growing.Rd +++ b/man/sample_growing.Rd @@ -73,5 +73,5 @@ 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{igraph_growing_random_game()}}.} +\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 fe5aebc0bb..65bf4ff669 100644 --- a/man/sample_hierarchical_sbm.Rd +++ b/man/sample_hierarchical_sbm.Rd @@ -51,9 +51,11 @@ C <- matrix(c( ), nrow = 3) g <- sample_hierarchical_sbm(100, 10, rho = c(3, 3, 4) / 10, C = C, p = 1 / 20) g -if (require(Matrix)) { - image(g[]) -} + +\dontshow{if (rlang::is_installed("Matrix")) withAutoprint(\{ # examplesIf} +library("Matrix") +image(g[]) +\dontshow{\}) # examplesIf} } \seealso{ Random graph models (games) @@ -88,5 +90,5 @@ 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{igraph_hsbm_game()}}, \href{https://igraph.org/c/html/latest/igraph-Generators.html#igraph_hsbm_list_game}{\code{igraph_hsbm_list_game()}}.} +\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 f9ab883259..410101be39 100644 --- a/man/sample_hrg.Rd +++ b/man/sample_hrg.Rd @@ -28,5 +28,5 @@ 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{igraph_hrg_game()}}.} +\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 913e15b40f..f9ce2c20e0 100644 --- a/man/sample_islands.Rd +++ b/man/sample_islands.Rd @@ -67,5 +67,5 @@ 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{igraph_simple_interconnected_islands_game()}}.} +\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 66f2df1876..e81c2c3c23 100644 --- a/man/sample_k_regular.Rd +++ b/man/sample_k_regular.Rd @@ -79,5 +79,5 @@ 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{igraph_k_regular_game()}}.} +\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_sbm.Rd b/man/sample_sbm.Rd index 9985a7f18a..d7154c469b 100644 --- a/man/sample_sbm.Rd +++ b/man/sample_sbm.Rd @@ -84,5 +84,5 @@ 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{igraph_sbm_game()}}.} +\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 2d0545b317..69efb56e52 100644 --- a/man/sample_spanning_tree.Rd +++ b/man/sample_spanning_tree.Rd @@ -43,5 +43,5 @@ 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{igraph_random_spanning_tree()}}.} +\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_tree.Rd b/man/sample_tree.Rd index 046ca29e35..7bd7c24b9c 100644 --- a/man/sample_tree.Rd +++ b/man/sample_tree.Rd @@ -65,5 +65,5 @@ 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{igraph_tree_game()}}.} +\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/similarity.Rd b/man/similarity.Rd index 8a721c823d..5f124a707b 100644 --- a/man/similarity.Rd +++ b/man/similarity.Rd @@ -78,5 +78,5 @@ 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{igraph_similarity_jaccard()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_dice}{\code{igraph_similarity_dice()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_similarity_inverse_log_weighted}{\code{igraph_similarity_inverse_log_weighted()}}.} +\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/simplify.Rd b/man/simplify.Rd index 564889e89d..9ebaa39c3c 100644 --- a/man/simplify.Rd +++ b/man/simplify.Rd @@ -103,5 +103,5 @@ 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{igraph_simplify()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_simple}{\code{igraph_is_simple()}}.} +\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 4a18a428ff..6bfe884bcd 100644 --- a/man/sir.Rd +++ b/man/sir.Rd @@ -119,5 +119,5 @@ 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{igraph_sir()}}.} +\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/st_cuts.Rd b/man/st_cuts.Rd index d8922a74bc..20fb618e09 100644 --- a/man/st_cuts.Rd +++ b/man/st_cuts.Rd @@ -66,5 +66,5 @@ 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{igraph_all_st_cuts()}}.} +\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 111c13a604..efa7d1df96 100644 --- a/man/st_min_cuts.Rd +++ b/man/st_min_cuts.Rd @@ -76,5 +76,5 @@ 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{igraph_all_st_mincuts()}}.} +\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/strength.Rd b/man/strength.Rd index 20956112c6..76a2e34f9b 100644 --- a/man/strength.Rd +++ b/man/strength.Rd @@ -74,5 +74,5 @@ 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{igraph_strength()}}.} +\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/to_prufer.Rd b/man/to_prufer.Rd index 9ddaa6b920..38d7ceee13 100644 --- a/man/to_prufer.Rd +++ b/man/to_prufer.Rd @@ -41,5 +41,5 @@ 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{igraph_to_prufer()}}.} +\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/triad_census.Rd b/man/triad_census.Rd index 9014898a62..58d7c144d4 100644 --- a/man/triad_census.Rd +++ b/man/triad_census.Rd @@ -54,5 +54,5 @@ 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{igraph_triad_census()}}.} +\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/vertex.shape.pie.Rd b/man/vertex.shape.pie.Rd index 8ed85f4b05..5c59f6413c 100644 --- a/man/vertex.shape.pie.Rd +++ b/man/vertex.shape.pie.Rd @@ -29,14 +29,13 @@ slices.} } \examples{ g <- make_ring(10) -values <- lapply(1:10, function(x) sample(1:10, 3)) -if (interactive()) { - plot(g, - vertex.shape = "pie", vertex.pie = values, - vertex.pie.color = list(heat.colors(5)), - vertex.size = seq(10, 30, length.out = 10), vertex.label = NA - ) -} +values <- lapply(1:10, function(x) sample(1:10,3)) + +\dontshow{if (interactive()) withAutoprint(\{ # examplesIf} +plot(g, vertex.shape = "pie", vertex.pie = values, + vertex.pie.color = list(heat.colors(5)), + vertex.size = seq(10, 30, length.out = 10), vertex.label = NA) +\dontshow{\}) # examplesIf} } \seealso{ \code{\link[=igraph.plotting]{igraph.plotting()}}, \code{\link[=plot.igraph]{plot.igraph()}} diff --git a/man/voronoi_cells.Rd b/man/voronoi_cells.Rd index 25cdc2edd9..0c674fa968 100644 --- a/man/voronoi_cells.Rd +++ b/man/voronoi_cells.Rd @@ -85,5 +85,5 @@ 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{igraph_voronoi()}}.} +\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/weighted_cliques.Rd b/man/weighted_cliques.Rd index 0718dd33aa..87620a75a8 100644 --- a/man/weighted_cliques.Rd +++ b/man/weighted_cliques.Rd @@ -75,5 +75,5 @@ 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{igraph_weighted_cliques()}}.} +\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 8dcfbc305c..7fd5731e4f 100644 --- a/man/which_multiple.Rd +++ b/man/which_multiple.Rd @@ -115,5 +115,5 @@ 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{igraph_is_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_multiple}{\code{igraph_has_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_count_multiple}{\code{igraph_count_multiple()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_is_loop}{\code{igraph_is_loop()}}, \href{https://igraph.org/c/html/latest/igraph-Structural.html#igraph_has_loop}{\code{igraph_has_loop()}}.} +\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()}}.} diff --git a/man/which_mutual.Rd b/man/which_mutual.Rd index f047cc424c..99bb3d18a2 100644 --- a/man/which_mutual.Rd +++ b/man/which_mutual.Rd @@ -72,5 +72,5 @@ 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{igraph_is_mutual()}}.} +\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 e3e2571bc8..388e15b72b 100644 --- a/man/write_graph.Rd +++ b/man/write_graph.Rd @@ -85,5 +85,5 @@ 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{igraph_write_graph_dimacs_flow()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_dot}{\code{igraph_write_graph_dot()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_edgelist}{\code{igraph_write_graph_edgelist()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_gml}{\code{igraph_write_graph_gml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_graphml}{\code{igraph_write_graph_graphml()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_leda}{\code{igraph_write_graph_leda()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_lgl}{\code{igraph_write_graph_lgl()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_ncol}{\code{igraph_write_graph_ncol()}}, \href{https://igraph.org/c/html/latest/igraph-Foreign.html#igraph_write_graph_pajek}{\code{igraph_write_graph_pajek()}}.} +\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()}}.}