Skip to content

docs: link to replacements of deprecated functions #1823

New issue

Have a question about this project? # for a free GitHub account to open an issue and contact its maintainers and the community.

By clicking “#”, you agree to our terms of service and privacy statement. We’ll occasionally send you account related emails.

Already on GitHub? # to your account

Open
wants to merge 5 commits into
base: main
Choose a base branch
from
Open
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
The table of contents is too big for display.
Diff view
Diff view
  •  
  •  
  •  
2 changes: 1 addition & 1 deletion R/adjacency.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `graph.adjacency()` was renamed to `graph_from_adjacency_matrix()` to create a more
#' `graph.adjacency()` was renamed to [graph_from_adjacency_matrix()] to create a more
#' consistent API.
#' @inheritParams graph_from_adjacency_matrix
#' @keywords internal
Expand Down
4 changes: 2 additions & 2 deletions R/assortativity.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `assortativity.nominal()` was renamed to `assortativity_nominal()` to create a more
#' `assortativity.nominal()` was renamed to [assortativity_nominal()] to create a more
#' consistent API.
#' @inheritParams assortativity_nominal
#' @keywords internal
Expand All @@ -18,7 +18,7 @@ assortativity.nominal <- function(graph, types, directed = TRUE, normalized = TR
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `assortativity.degree()` was renamed to `assortativity_degree()` to create a more
#' `assortativity.degree()` was renamed to [assortativity_degree()] to create a more
#' consistent API.
#' @inheritParams assortativity_degree
#' @keywords internal
Expand Down
30 changes: 15 additions & 15 deletions R/attributes.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `set.vertex.attribute()` was renamed to `set_vertex_attr()` to create a more
#' `set.vertex.attribute()` was renamed to [set_vertex_attr()] to create a more
#' consistent API.
#' @inheritParams set_vertex_attr
#' @keywords internal
Expand All @@ -23,7 +23,7 @@ set.vertex.attribute <- function(graph, name, index = V(graph), value) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `set.graph.attribute()` was renamed to `set_graph_attr()` to create a more
#' `set.graph.attribute()` was renamed to [set_graph_attr()] to create a more
#' consistent API.
#' @inheritParams set_graph_attr
#' @keywords internal
Expand All @@ -43,7 +43,7 @@ set.graph.attribute <- function(graph, name, value) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `set.edge.attribute()` was renamed to `set_edge_attr()` to create a more
#' `set.edge.attribute()` was renamed to [set_edge_attr()] to create a more
#' consistent API.
#' @inheritParams set_edge_attr
#' @keywords internal
Expand All @@ -59,7 +59,7 @@ set.edge.attribute <- function(graph, name, index = E(graph), value) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `remove.vertex.attribute()` was renamed to `delete_vertex_attr()` to create a more
#' `remove.vertex.attribute()` was renamed to [delete_vertex_attr()] to create a more
#' consistent API.
#' @inheritParams delete_vertex_attr
#' @keywords internal
Expand All @@ -79,7 +79,7 @@ remove.vertex.attribute <- function(graph, name) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `remove.graph.attribute()` was renamed to `delete_graph_attr()` to create a more
#' `remove.graph.attribute()` was renamed to [delete_graph_attr()] to create a more
#' consistent API.
#' @inheritParams delete_graph_attr
#' @keywords internal
Expand All @@ -99,7 +99,7 @@ remove.graph.attribute <- function(graph, name) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `remove.edge.attribute()` was renamed to `delete_edge_attr()` to create a more
#' `remove.edge.attribute()` was renamed to [delete_edge_attr()] to create a more
#' consistent API.
#' @inheritParams delete_edge_attr
#' @keywords internal
Expand All @@ -119,7 +119,7 @@ remove.edge.attribute <- function(graph, name) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `list.vertex.attributes()` was renamed to `vertex_attr_names()` to create a more
#' `list.vertex.attributes()` was renamed to [vertex_attr_names()] to create a more
#' consistent API.
#' @inheritParams vertex_attr_names
#' @keywords internal
Expand All @@ -139,7 +139,7 @@ list.vertex.attributes <- function(graph) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `list.graph.attributes()` was renamed to `graph_attr_names()` to create a more
#' `list.graph.attributes()` was renamed to [graph_attr_names()] to create a more
#' consistent API.
#' @inheritParams graph_attr_names
#' @keywords internal
Expand All @@ -159,7 +159,7 @@ list.graph.attributes <- function(graph) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `list.edge.attributes()` was renamed to `edge_attr_names()` to create a more
#' `list.edge.attributes()` was renamed to [edge_attr_names()] to create a more
#' consistent API.
#' @inheritParams edge_attr_names
#' @keywords internal
Expand All @@ -179,7 +179,7 @@ list.edge.attributes <- function(graph) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `is.weighted()` was renamed to `is_weighted()` to create a more
#' `is.weighted()` was renamed to [is_weighted()] to create a more
#' consistent API.
#' @inheritParams is_weighted
#' @keywords internal
Expand All @@ -195,7 +195,7 @@ is.weighted <- function(graph) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `is.named()` was renamed to `is_named()` to create a more
#' `is.named()` was renamed to [is_named()] to create a more
#' consistent API.
#' @inheritParams is_named
#' @keywords internal
Expand All @@ -211,7 +211,7 @@ is.named <- function(graph) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `is.bipartite()` was renamed to `is_bipartite()` to create a more
#' `is.bipartite()` was renamed to [is_bipartite()] to create a more
#' consistent API.
#' @inheritParams is_bipartite
#' @keywords internal
Expand All @@ -227,7 +227,7 @@ is.bipartite <- function(graph) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `get.vertex.attribute()` was renamed to `vertex_attr()` to create a more
#' `get.vertex.attribute()` was renamed to [vertex_attr()] to create a more
#' consistent API.
#' @inheritParams vertex_attr
#' @keywords internal
Expand All @@ -243,7 +243,7 @@ get.vertex.attribute <- function(graph, name, index = V(graph)) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `get.graph.attribute()` was renamed to `graph_attr()` to create a more
#' `get.graph.attribute()` was renamed to [graph_attr()] to create a more
#' consistent API.
#' @inheritParams graph_attr
#' @keywords internal
Expand All @@ -259,7 +259,7 @@ get.graph.attribute <- function(graph, name) {
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `get.edge.attribute()` was renamed to `edge_attr()` to create a more
#' `get.edge.attribute()` was renamed to [edge_attr()] to create a more
#' consistent API.
#' @inheritParams edge_attr
#' @keywords internal
Expand Down
2 changes: 1 addition & 1 deletion R/basic.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `is.igraph()` was renamed to `is_igraph()` to create a more
#' `is.igraph()` was renamed to [is_igraph()] to create a more
#' consistent API.
#' @inheritParams is_igraph
#' @keywords internal
Expand Down
6 changes: 3 additions & 3 deletions R/bipartite.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `bipartite.projection.size()` was renamed to `bipartite_projection_size()` to create a more
#' `bipartite.projection.size()` was renamed to [bipartite_projection_size()] to create a more
#' consistent API.
#' @inheritParams bipartite_projection_size
#' @keywords internal
Expand All @@ -18,7 +18,7 @@ bipartite.projection.size <- function(graph, types = NULL) { # nocov start
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `bipartite.projection()` was renamed to `bipartite_projection()` to create a more
#' `bipartite.projection()` was renamed to [bipartite_projection()] to create a more
#' consistent API.
#' @inheritParams bipartite_projection
#' @keywords internal
Expand All @@ -33,7 +33,7 @@ bipartite.projection <- function(graph, types = NULL, multiplicity = TRUE, probe
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `bipartite.mapping()` was renamed to `bipartite_mapping()` to create a more
#' `bipartite.mapping()` was renamed to [bipartite_mapping()] to create a more
#' consistent API.
#' @inheritParams bipartite_mapping
#' @keywords internal
Expand Down
28 changes: 14 additions & 14 deletions R/centrality.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `subgraph.centrality()` was renamed to `subgraph_centrality()` to create a more
#' `subgraph.centrality()` was renamed to [subgraph_centrality()] to create a more
#' consistent API.
#' @inheritParams subgraph_centrality
#' @keywords internal
Expand All @@ -18,7 +18,7 @@ subgraph.centrality <- function(graph, diag = FALSE) { # nocov start
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `page.rank()` was renamed to `page_rank()` to create a more
#' `page.rank()` was renamed to [page_rank()] to create a more
#' consistent API.
#' @inheritParams page_rank
#' @keywords internal
Expand All @@ -33,7 +33,7 @@ page.rank <- function(graph, algo = c("prpack", "arpack"), vids = V(graph), dire
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `hub.score()` was renamed to `hub_score()` to create a more
#' `hub.score()` was renamed to [hub_score()] to create a more
#' consistent API.
#' @inheritParams hub_score
#' @keywords internal
Expand All @@ -48,7 +48,7 @@ hub.score <- function(graph, scale = TRUE, weights = NULL, options = arpack_defa
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `authority.score()` was renamed to `authority_score()` to create a more
#' `authority.score()` was renamed to [authority_score()] to create a more
#' consistent API.
#' @inheritParams authority_score
#' @keywords internal
Expand All @@ -63,7 +63,7 @@ authority.score <- function(graph, scale = TRUE, weights = NULL, options = arpac
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `graph.strength()` was renamed to `strength()` to create a more
#' `graph.strength()` was renamed to [strength()] to create a more
#' consistent API.
#' @inheritParams strength
#' @keywords internal
Expand All @@ -78,7 +78,7 @@ graph.strength <- function(graph, vids = V(graph), mode = c("all", "out", "in",
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `graph.eigen()` was renamed to `spectrum()` to create a more
#' `graph.eigen()` was renamed to [spectrum()] to create a more
#' consistent API.
#' @inheritParams spectrum
#' @keywords internal
Expand All @@ -93,7 +93,7 @@ graph.eigen <- function(graph, algorithm = c("arpack", "auto", "lapack", "comp_a
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `graph.diversity()` was renamed to `diversity()` to create a more
#' `graph.diversity()` was renamed to [diversity()] to create a more
#' consistent API.
#' @inheritParams diversity
#' @keywords internal
Expand All @@ -108,7 +108,7 @@ graph.diversity <- function(graph, weights = NULL, vids = V(graph)) { # nocov st
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `evcent()` was renamed to `eigen_centrality()` to create a more
#' `evcent()` was renamed to [eigen_centrality()] to create a more
#' consistent API.
#' @inheritParams eigen_centrality
#' @keywords internal
Expand All @@ -123,7 +123,7 @@ evcent <- function(graph, directed = FALSE, scale = TRUE, weights = NULL, option
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `edge.betweenness()` was renamed to `edge_betweenness()` to create a more
#' `edge.betweenness()` was renamed to [edge_betweenness()] to create a more
#' consistent API.
#' @inheritParams edge_betweenness
#' @keywords internal
Expand All @@ -138,7 +138,7 @@ edge.betweenness <- function(graph, e = E(graph), directed = TRUE, weights = NUL
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `bonpow()` was renamed to `power_centrality()` to create a more
#' `bonpow()` was renamed to [power_centrality()] to create a more
#' consistent API.
#' @inheritParams power_centrality
#' @keywords internal
Expand All @@ -153,7 +153,7 @@ bonpow <- function(graph, nodes = V(graph), loops = FALSE, exponent = 1, rescale
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `alpha.centrality()` was renamed to `alpha_centrality()` to create a more
#' `alpha.centrality()` was renamed to [alpha_centrality()] to create a more
#' consistent API.
#' @inheritParams alpha_centrality
#' @keywords internal
Expand Down Expand Up @@ -188,7 +188,7 @@ alpha.centrality <- function(graph, nodes = V(graph), alpha = 1, loops = FALSE,
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' Use [`betweenness()`] with the `cutoff` argument instead.
#' Use [betweenness()] with the `cutoff` argument instead.
#' @param vids The vertices for which the vertex betweenness estimation will be
#' calculated.
#' @inheritParams betweenness
Expand Down Expand Up @@ -351,7 +351,7 @@ edge_betweenness <- function(graph, e = E(graph),
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' Use [`edge_betweenness()`] with the `cutoff` argument instead.
#' Use [edge_betweenness()] with the `cutoff` argument instead.
#' @inheritParams edge_betweenness
#' @keywords internal
#' @export
Expand Down Expand Up @@ -467,7 +467,7 @@ closeness <- function(graph, vids = V(graph),
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' Use [`closeness()`] with the `cutoff` argument instead.
#' Use [closeness()] with the `cutoff` argument instead.
#' @inheritParams closeness
#' @keywords internal
#' @export
Expand Down
Loading
Loading