#' Set vertex attributes
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `set.vertex.attribute()` was renamed to [set_vertex_attr()] to create a more
#' consistent API.
#' @inheritParams set_vertex_attr
#' @keywords internal
#' @export
set.vertex.attribute <- function(graph, name, index = V(graph), value) {
# nocov start
lifecycle::deprecate_soft(
"2.0.0",
"set.vertex.attribute()",
"set_vertex_attr()"
)
set_vertex_attr(graph = graph, name = name, index = index, value = value)
} # nocov end
#' Set a graph attribute
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `set.graph.attribute()` was renamed to [set_graph_attr()] to create a more
#' consistent API.
#' @inheritParams set_graph_attr
#' @keywords internal
#' @export
set.graph.attribute <- function(graph, name, value) {
# nocov start
lifecycle::deprecate_soft(
"2.0.0",
"set.graph.attribute()",
"set_graph_attr()"
)
set_graph_attr(graph = graph, name = name, value = value)
} # nocov end
#' Set edge attributes
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `set.edge.attribute()` was renamed to [set_edge_attr()] to create a more
#' consistent API.
#' @inheritParams set_edge_attr
#' @keywords internal
#' @export
set.edge.attribute <- function(graph, name, index = E(graph), value) {
# nocov start
lifecycle::deprecate_soft("2.0.0", "set.edge.attribute()", "set_edge_attr()")
set_edge_attr(graph = graph, name = name, index = index, value = value)
} # nocov end
#' Delete a vertex attribute
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `remove.vertex.attribute()` was renamed to [delete_vertex_attr()] to create a more
#' consistent API.
#' @inheritParams delete_vertex_attr
#' @keywords internal
#' @export
remove.vertex.attribute <- function(graph, name) {
# nocov start
lifecycle::deprecate_soft(
"2.0.0",
"remove.vertex.attribute()",
"delete_vertex_attr()"
)
delete_vertex_attr(graph = graph, name = name)
} # nocov end
#' Delete a graph attribute
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `remove.graph.attribute()` was renamed to [delete_graph_attr()] to create a more
#' consistent API.
#' @inheritParams delete_graph_attr
#' @keywords internal
#' @export
remove.graph.attribute <- function(graph, name) {
# nocov start
lifecycle::deprecate_soft(
"2.0.0",
"remove.graph.attribute()",
"delete_graph_attr()"
)
delete_graph_attr(graph = graph, name = name)
} # nocov end
#' Delete an edge attribute
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `remove.edge.attribute()` was renamed to [delete_edge_attr()] to create a more
#' consistent API.
#' @inheritParams delete_edge_attr
#' @keywords internal
#' @export
remove.edge.attribute <- function(graph, name) {
# nocov start
lifecycle::deprecate_soft(
"2.0.0",
"remove.edge.attribute()",
"delete_edge_attr()"
)
delete_edge_attr(graph = graph, name = name)
} # nocov end
#' List names of vertex attributes
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `list.vertex.attributes()` was renamed to [vertex_attr_names()] to create a more
#' consistent API.
#' @inheritParams vertex_attr_names
#' @keywords internal
#' @export
list.vertex.attributes <- function(graph) {
# nocov start
lifecycle::deprecate_soft(
"2.0.0",
"list.vertex.attributes()",
"vertex_attr_names()"
)
vertex_attr_names(graph = graph)
} # nocov end
#' List names of graph attributes
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `list.graph.attributes()` was renamed to [graph_attr_names()] to create a more
#' consistent API.
#' @inheritParams graph_attr_names
#' @keywords internal
#' @export
list.graph.attributes <- function(graph) {
# nocov start
lifecycle::deprecate_soft(
"2.0.0",
"list.graph.attributes()",
"graph_attr_names()"
)
graph_attr_names(graph = graph)
} # nocov end
#' List names of edge attributes
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `list.edge.attributes()` was renamed to [edge_attr_names()] to create a more
#' consistent API.
#' @inheritParams edge_attr_names
#' @keywords internal
#' @export
list.edge.attributes <- function(graph) {
# nocov start
lifecycle::deprecate_soft(
"2.0.0",
"list.edge.attributes()",
"edge_attr_names()"
)
edge_attr_names(graph = graph)
} # nocov end
#' Weighted graphs
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `is.weighted()` was renamed to [is_weighted()] to create a more
#' consistent API.
#' @inheritParams is_weighted
#' @keywords internal
#' @export
is.weighted <- function(graph) {
# nocov start
lifecycle::deprecate_soft("2.0.0", "is.weighted()", "is_weighted()")
is_weighted(graph = graph)
} # nocov end
#' Named graphs
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `is.named()` was renamed to [is_named()] to create a more
#' consistent API.
#' @inheritParams is_named
#' @keywords internal
#' @export
is.named <- function(graph) {
# nocov start
lifecycle::deprecate_soft("2.0.0", "is.named()", "is_named()")
is_named(graph = graph)
} # nocov end
#' Checks whether the graph has a vertex attribute called `type`
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `is.bipartite()` was renamed to [is_bipartite()] to create a more
#' consistent API.
#' @inheritParams is_bipartite
#' @keywords internal
#' @export
is.bipartite <- function(graph) {
# nocov start
lifecycle::deprecate_soft("2.0.0", "is.bipartite()", "is_bipartite()")
is_bipartite(graph = graph)
} # nocov end
#' Query vertex attributes of a graph
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `get.vertex.attribute()` was renamed to [vertex_attr()] to create a more
#' consistent API.
#' @inheritParams vertex_attr
#' @keywords internal
#' @export
get.vertex.attribute <- function(graph, name, index = V(graph)) {
# nocov start
lifecycle::deprecate_soft("2.0.0", "get.vertex.attribute()", "vertex_attr()")
vertex_attr(graph = graph, name = name, index = index)
} # nocov end
#' Graph attributes of a graph
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `get.graph.attribute()` was renamed to [graph_attr()] to create a more
#' consistent API.
#' @inheritParams graph_attr
#' @keywords internal
#' @export
get.graph.attribute <- function(graph, name) {
# nocov start
lifecycle::deprecate_soft("2.0.0", "get.graph.attribute()", "graph_attr()")
graph_attr(graph = graph, name = name)
} # nocov end
#' Query edge attributes of a graph
#'
#' @description
#' `r lifecycle::badge("deprecated")`
#'
#' `get.edge.attribute()` was renamed to [edge_attr()] to create a more
#' consistent API.
#' @inheritParams edge_attr
#' @keywords internal
#' @export
get.edge.attribute <- function(graph, name, index = E(graph)) {
# nocov start
lifecycle::deprecate_soft("2.0.0", "get.edge.attribute()", "edge_attr()")
edge_attr(graph = graph, name = name, index = index)
} # nocov end
# IGraph R package
# Copyright (C) 2005-2012 Gabor Csardi <csardi.gabor@gmail.com>
# 334 Harvard street, Cambridge, MA 02139 USA
#
# This program is free software; you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
# the Free Software Foundation; either version 2 of the License, or
# (at your option) any later version.
#
# This program is distributed in the hope that it will be useful,
# but WITHOUT ANY WARRANTY; without even the implied warranty of
# MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
# GNU General Public License for more details.
#
# You should have received a copy of the GNU General Public License
# along with this program; if not, write to the Free Software
# Foundation, Inc., 51 Franklin Street, Fifth Floor, Boston, MA
# 02110-1301 USA
#
###################################################################
##
## The brand new attribute interface:
##
## g(graph)$name # get a graph attribute
## g(graph)$name <- "Ring" # set a graph attribute
##
## v(graph)$color <- "red" # set vertex attribute
## v(graph)$color[1:5] <- "blue"
## v(graph)$color[c(5,6,7)] # get vertex attribute
##
## e(graph)$weight <- 1 # set edge attribute
## e(graph)$weight[1:10] # get edge attribute
##
#' Graph attributes of a graph
#'
#' @param graph Input graph.
#' @param name The name of attribute to query. If missing, then all
#' attributes are returned in a list.
#' @return A list of graph attributes, or a single graph attribute.
#'
#' @aliases graph.attributes
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10)
#' graph_attr(g)
#' graph_attr(g, "name")
graph_attr <- function(graph, name) {
ensure_igraph(graph)
if (missing(name)) {
return(graph.attributes(graph))
}
check_string(name)
.Call(R_igraph_mybracket2, graph, igraph_t_idx_attr, igraph_attr_idx_graph)[[
name
]]
}
#' Set all or some graph attributes
#'
#' @param graph The graph.
#' @param name The name of the attribute to set. If missing, then
#' `value` should be a named list, and all list members
#' are set as attributes.
#' @param value The value of the attribute to set
#' @return The graph, with the attribute(s) added.
#'
#' @aliases graph.attributes<-
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_graph(~ A - B:C:D)
#' graph_attr(g, "name") <- "4-star"
#' g
#'
#' graph_attr(g) <- list(
#' layout = layout_with_fr(g),
#' name = "4-star layed out"
#' )
#' plot(g)
`graph_attr<-` <- function(graph, name, value) {
if (missing(name)) {
`graph.attributes<-`(graph, value)
} else {
check_string(name)
set_graph_attr(graph, name, value)
}
}
#' Set a graph attribute
#'
#' An existing attribute with the same name is overwritten.
#'
#' @param graph The graph.
#' @param name The name of the attribute to set.
#' @param value New value of the attribute.
#' @return The graph with the new graph attribute added or set.
#'
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_graph_attr("layout", layout_with_fr)
#' g
#' plot(g)
set_graph_attr <- function(graph, name, value) {
check_string(name)
ensure_igraph(graph)
.Call(
R_igraph_mybracket3_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_graph,
name,
value
)
}
#' @export
graph.attributes <- function(graph) {
ensure_igraph(graph)
.Call(
R_igraph_mybracket2_copy,
graph,
igraph_t_idx_attr,
igraph_attr_idx_graph
)
}
#' @export
"graph.attributes<-" <- function(graph, value) {
ensure_igraph(graph)
assert_named_list(value)
if (inherits(value, "data.frame")) {
value <- as.list(value)
}
.Call(
R_igraph_mybracket2_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_graph,
value
)
}
#' Query vertex attributes of a graph
#'
#' @param graph The graph.
#' @param name Name of the attribute to query. If missing, then
#' all vertex attributes are returned in a list.
#' @param index An optional vertex sequence to query the attribute only
#' for these vertices.
#' @return The value of the vertex attribute, or the list of
#' all vertex attributes, if `name` is missing.
#'
#' @aliases vertex.attributes
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_vertex_attr("color", value = "red") %>%
#' set_vertex_attr("label", value = letters[1:10])
#' vertex_attr(g, "label")
#' vertex_attr(g)
#' plot(g)
vertex_attr <- function(graph, name, index = V(graph)) {
ensure_igraph(graph)
if (missing(name)) {
if (missing(index)) {
return(vertex.attributes(graph))
}
return(vertex.attributes(graph, index = index))
}
check_string(name)
myattr <-
.Call(
R_igraph_mybracket2,
graph,
igraph_t_idx_attr,
igraph_attr_idx_vertex
)[[name]]
if (is_complete_iterator(index)) {
return(myattr)
}
index <- as_igraph_vs(graph, index)
myattr[index]
}
#' Set one or more vertex attributes
#'
#' @param graph The graph.
#' @param name The name of the vertex attribute to set. If missing,
#' then `value` must be a named list, and its entries are
#' set as vertex attributes.
#' @param index An optional vertex sequence to set the attributes
#' of a subset of vertices.
#' @param value The new value of the attribute(s) for all
#' (or `index`) vertices.
#' @return The graph, with the vertex attribute(s) added or set.
#'
#' @aliases vertex.attributes<-
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10)
#' vertex_attr(g) <- list(
#' name = LETTERS[1:10],
#' color = rep("yellow", gorder(g))
#' )
#' vertex_attr(g, "label") <- V(g)$name
#' g
#' plot(g)
`vertex_attr<-` <- function(graph, name, index = V(graph), value) {
if (missing(name)) {
`vertex.attributes<-`(graph, index = index, value = value)
} else {
check_string(name)
set_vertex_attr(graph, name = name, index = index, value = value)
}
}
#' Set vertex attributes
#'
#' @param graph The graph.
#' @param name The name of the attribute to set.
#' @param index An optional vertex sequence to set the attributes
#' of a subset of vertices.
#' @param value The new value of the attribute for all (or `index`)
#' vertices.
#' If `NULL`, the input is returned unchanged.
#' @return The graph, with the vertex attribute added or set.
#'
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_vertex_attr("label", value = LETTERS[1:10])
#' g
#' plot(g)
set_vertex_attr <- function(graph, name, index = V(graph), value) {
check_string(name)
if (is_complete_iterator(index)) {
i_set_vertex_attr(graph = graph, name = name, value = value, check = FALSE)
} else {
i_set_vertex_attr(graph = graph, name = name, index = index, value = value)
}
}
i_set_vertex_attr <- function(
graph,
name,
index = V(graph),
value,
check = TRUE
) {
ensure_igraph(graph)
check_string(name)
if (is.null(value)) {
return(graph)
}
# https://github.com/igraph/rigraph/issues/807
# Checks if any of those classes is inherited from
if (inherits(value, c("igraph.vs", "igraph.es"))) {
value <- as.numeric(value)
}
if (!missing(index) && check) {
index <- as_igraph_vs(graph, index)
}
vattrs <- .Call(
R_igraph_mybracket2,
graph,
igraph_t_idx_attr,
igraph_attr_idx_vertex
)
complete <- is_complete_iterator(index)
name_available <- (name %in% names(vattrs))
if (!complete && !name_available) {
vattrs[[name]] <- value[rep.int(NA_integer_, vcount(graph))]
}
single <- is_single_index(index)
if (single) {
vattrs[[name]][[index]] <- value
} else {
if (length(value) == 1) {
value_in <- rep(unname(value), length(index))
} else if (length(value) == length(index)) {
value_in <- unname(value)
} else {
cli::cli_abort(
"Length of new attribute value must be {if (length(index) != 1) '1 or '}{length(index)}, the number of target vertices, not {length(value)}."
)
}
if (complete) {
vattrs[[name]] <- value_in
} else {
vattrs[[name]][index] <- value_in
}
}
.Call(
R_igraph_mybracket2_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_vertex,
vattrs
)
}
#' @export
vertex.attributes <- function(graph, index = V(graph)) {
ensure_igraph(graph)
if (!missing(index)) {
index <- as_igraph_vs(graph, index)
}
res <- .Call(
R_igraph_mybracket2_copy,
graph,
igraph_t_idx_attr,
igraph_attr_idx_vertex
)
if (!missing(index)) {
if (!index_is_natural_sequence(index, graph)) {
for (i in seq_along(res)) {
res[[i]] <- res[[i]][index]
}
}
}
res
}
set_value_at <- function(value, idx, length_out) {
out <- value[NULL]
length(out) <- length_out
out[idx] <- value
unname(out)
}
#' @export
"vertex.attributes<-" <- function(graph, index = V(graph), value) {
ensure_igraph(graph)
assert_named_list(value)
if (inherits(value, "data.frame")) {
value <- as.list(value)
}
if (!all(lengths(value) == length(index))) {
cli::cli_abort(
"Invalid attribute value length, must match number of vertices."
)
}
if (!missing(index)) {
index <- as_igraph_vs(graph, index)
if (anyDuplicated(index) || anyNA(index)) {
cli::cli_abort("{.arg index} contains duplicated vertices or NAs.")
}
}
if (!missing(index) && !index_is_natural_sequence(index, graph)) {
value <- map(
value,
set_value_at,
idx = index,
length_out = length(V(graph))
)
}
.Call(
R_igraph_mybracket2_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_vertex,
value
)
}
#' Query edge attributes of a graph
#'
#' @param graph The graph
#' @param name The name of the attribute to query. If missing, then
#' all edge attributes are returned in a list.
#' @param index An optional edge sequence to query edge attributes
#' for a subset of edges.
#' @return The value of the edge attribute, or the list of all
#' edge attributes if `name` is missing.
#'
#' @aliases edge.attributes
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_edge_attr("weight", value = 1:10) %>%
#' set_edge_attr("color", value = "red")
#' g
#' plot(g, edge.width = E(g)$weight)
edge_attr <- function(graph, name, index = E(graph)) {
ensure_igraph(graph)
if (missing(name)) {
if (missing(index)) {
edge.attributes(graph)
} else {
edge.attributes(graph, index = index)
}
} else {
check_string(name)
myattr <- .Call(
R_igraph_mybracket2,
graph,
igraph_t_idx_attr,
igraph_attr_idx_edge
)[[name]]
if (is_complete_iterator(index)) {
myattr
} else {
index <- as_igraph_es(graph, index)
myattr[index]
}
}
}
#' Set one or more edge attributes
#'
#' @param graph The graph.
#' @param name The name of the edge attribute to set. If missing,
#' then `value` must be a named list, and its entries are
#' set as edge attributes.
#' @param index An optional edge sequence to set the attributes
#' of a subset of edges.
#' @param value The new value of the attribute(s) for all
#' (or `index`) edges.
#' @return The graph, with the edge attribute(s) added or set.
#'
#' @aliases edge.attributes<-
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10)
#' edge_attr(g) <- list(
#' name = LETTERS[1:10],
#' color = rep("green", gsize(g))
#' )
#' edge_attr(g, "label") <- E(g)$name
#' g
#' plot(g)
`edge_attr<-` <- function(graph, name, index = E(graph), value) {
if (missing(name)) {
`edge.attributes<-`(graph, index = index, value = value)
} else {
check_string(name)
set_edge_attr(graph, name = name, index = index, value = value)
}
}
#' Set edge attributes
#'
#' @param graph The graph
#' @param name The name of the attribute to set.
#' @param index An optional edge sequence to set the attributes of
#' a subset of edges.
#' @param value The new value of the attribute for all (or `index`)
#' edges.
#' If `NULL`, the input is returned unchanged.
#' @return The graph, with the edge attribute added or set.
#'
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_edge_attr("label", value = LETTERS[1:10])
#' g
#' plot(g)
set_edge_attr <- function(graph, name, index = E(graph), value) {
check_string(name)
if (is_complete_iterator(index)) {
i_set_edge_attr(graph = graph, name = name, value = value, check = FALSE)
} else {
i_set_edge_attr(graph = graph, name = name, index = index, value = value)
}
}
i_set_edge_attr <- function(
graph,
name,
index = E(graph),
value,
check = TRUE
) {
ensure_igraph(graph)
check_string(name)
if (is.null(value)) {
return(graph)
}
# https://github.com/igraph/rigraph/issues/807
# Checks if any of those classes is inherited from
if (inherits(value, c("igraph.vs", "igraph.es"))) {
value <- as.numeric(value)
}
complete <- is_complete_iterator(index)
single <- is_single_index(index)
if (!missing(index) && check) {
index <- as_igraph_es(graph, index)
}
eattrs <- .Call(
R_igraph_mybracket2,
graph,
igraph_t_idx_attr,
igraph_attr_idx_edge
)
if (!complete && !(name %in% names(eattrs))) {
eattrs[[name]] <- value[rep.int(NA_integer_, ecount(graph))]
}
if (single) {
eattrs[[name]][[index]] <- value
} else {
if (length(value) == 1) {
value_in <- rep(unname(value), length(index))
} else if (length(value) == length(index)) {
value_in <- unname(value)
} else {
cli::cli_abort(
"Length of new attribute value must be {if (length(index) != 1) '1 or '}{length(index)}, the number of target edges, not {length(value)}."
)
}
if (complete) {
eattrs[[name]] <- value_in
} else {
eattrs[[name]][index] <- value_in
}
}
.Call(
R_igraph_mybracket2_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_edge,
eattrs
)
}
#' @export
edge.attributes <- function(graph, index = E(graph)) {
ensure_igraph(graph)
if (!missing(index)) {
index <- as_igraph_es(graph, index)
}
res <- .Call(
R_igraph_mybracket2_copy,
graph,
igraph_t_idx_attr,
igraph_attr_idx_edge
)
if (
!missing(index) &&
(length(index) != ecount(graph) || any(index != E(graph)))
) {
for (i in seq_along(res)) {
res[[i]] <- res[[i]][index]
}
}
res
}
#' @export
"edge.attributes<-" <- function(graph, index = E(graph), value) {
ensure_igraph(graph)
assert_named_list(value)
if (inherits(value, "data.frame")) {
value <- as.list(value)
}
if (any(sapply(value, length) != length(index))) {
cli::cli_abort("Invalid attribute value length, must match number of edges")
}
if (!missing(index)) {
index <- as_igraph_es(graph, index)
if (any(duplicated(index)) || any(is.na(index))) {
cli::cli_abort("{.arg index} contains duplicated edges or NAs.")
}
}
if (
!missing(index) &&
(length(index) != ecount(graph) || any(index != E(graph)))
) {
es <- E(graph)
for (i in seq_along(value)) {
tmp <- value[[i]]
length(tmp) <- 0
length(tmp) <- length(es)
tmp[index] <- value[[i]]
value[[i]] <- tmp
}
}
.Call(
R_igraph_mybracket2_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_edge,
value
)
}
#' List names of graph attributes
#'
#' @param graph The graph.
#' @return Character vector, the names of the graph attributes.
#'
#' @aliases attributes
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10)
#' graph_attr_names(g)
graph_attr_names <- function(graph) {
ensure_igraph(graph)
res <- .Call(
R_igraph_mybracket2_names,
graph,
igraph_t_idx_attr,
igraph_attr_idx_graph
)
if (is.null(res)) {
res <- character()
}
res
}
#' List names of vertex attributes
#'
#' @param graph The graph.
#' @return Character vector, the names of the vertex attributes.
#'
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_vertex_attr("name", value = LETTERS[1:10]) %>%
#' set_vertex_attr("color", value = rep("green", 10))
#' vertex_attr_names(g)
#' plot(g)
vertex_attr_names <- function(graph) {
ensure_igraph(graph)
res <- .Call(
R_igraph_mybracket2_names,
graph,
igraph_t_idx_attr,
igraph_attr_idx_vertex
)
if (is.null(res)) {
res <- character()
}
res
}
#' List names of edge attributes
#'
#' @param graph The graph.
#' @return Character vector, the names of the edge attributes.
#'
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_edge_attr("label", value = letters[1:10])
#' edge_attr_names(g)
#' plot(g)
edge_attr_names <- function(graph) {
ensure_igraph(graph)
res <- .Call(
R_igraph_mybracket2_names,
graph,
igraph_t_idx_attr,
igraph_attr_idx_edge
)
if (is.null(res)) {
res <- character()
}
res
}
#' Delete a graph attribute
#'
#' @param graph The graph.
#' @param name Name of the attribute to delete.
#' @return The graph, with the specified attribute removed.
#'
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10)
#' graph_attr_names(g)
#' g2 <- delete_graph_attr(g, "name")
#' graph_attr_names(g2)
delete_graph_attr <- function(graph, name) {
ensure_igraph(graph)
check_string(name)
if (!name %in% graph_attr_names(graph)) {
cli::cli_abort("No graph attribute {.arg {name}} found.")
}
gattr <- .Call(
R_igraph_mybracket2,
graph,
igraph_t_idx_attr,
igraph_attr_idx_graph
)
gattr[[name]] <- NULL
.Call(
R_igraph_mybracket2_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_graph,
gattr
)
}
#' Delete a vertex attribute
#'
#' @param graph The graph
#' @param name The name of the vertex attribute to delete.
#' @return The graph, with the specified vertex attribute removed.
#'
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_vertex_attr("name", value = LETTERS[1:10])
#' vertex_attr_names(g)
#' g2 <- delete_vertex_attr(g, "name")
#' vertex_attr_names(g2)
delete_vertex_attr <- function(graph, name) {
ensure_igraph(graph)
check_string(name)
if (!name %in% vertex_attr_names(graph)) {
cli::cli_abort("No vertex attribute {.arg {name}} found.")
}
vattr <- .Call(
R_igraph_mybracket2,
graph,
igraph_t_idx_attr,
igraph_attr_idx_vertex
)
vattr[[name]] <- NULL
.Call(
R_igraph_mybracket2_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_vertex,
vattr
)
}
#' Delete an edge attribute
#'
#' @param graph The graph
#' @param name The name of the edge attribute to delete.
#' @return The graph, with the specified edge attribute removed.
#'
#' @family attributes
#'
#' @export
#' @examples
#' g <- make_ring(10) %>%
#' set_edge_attr("name", value = LETTERS[1:10])
#' edge_attr_names(g)
#' g2 <- delete_edge_attr(g, "name")
#' edge_attr_names(g2)
delete_edge_attr <- function(graph, name) {
ensure_igraph(graph)
check_string(name)
if (!name %in% edge_attr_names(graph)) {
cli::cli_abort("No edge attribute {.arg {name}} found.")
}
eattr <- .Call(
R_igraph_mybracket2,
graph,
igraph_t_idx_attr,
igraph_attr_idx_edge
)
eattr[[name]] <- NULL
.Call(
R_igraph_mybracket2_set,
graph,
igraph_t_idx_attr,
igraph_attr_idx_edge,
eattr
)
}
#############
#' Named graphs
#'
#' An igraph graph is named, if there is a symbolic name associated with its
#' vertices.
#'
#' In igraph vertices can always be identified and specified via their numeric
#' vertex ids. This is, however, not always convenient, and in many cases there
#' exist symbolic ids that correspond to the vertices. To allow this more
#' flexible identification of vertices, one can assign a vertex attribute
#' called \sQuote{name} to an igraph graph. After doing this, the symbolic
#' vertex names can be used in all igraph functions, instead of the numeric
#' ids.
#'
#' Note that the uniqueness of vertex names are currently not enforced in
#' igraph, you have to check that for yourself, when assigning the vertex
#' names.
#'
#' @param graph The input graph.
#' @return A logical scalar.
#' @author Gabor Csardi \email{csardi.gabor@@gmail.com}
#' @export
#' @keywords graphs
#' @examples
#'
#' g <- make_ring(10)
#' is_named(g)
#' V(g)$name <- letters[1:10]
#' is_named(g)
#' neighbors(g, "a")
#'
is_named <- function(graph) {
ensure_igraph(graph)
"name" %in% vertex_attr_names(graph)
}
#' Weighted graphs
#'
#' In weighted graphs, a real number is assigned to each (directed or
#' undirected) edge.
#'
#' In igraph edge weights are represented via an edge attribute, called
#' \sQuote{weight}. The `is_weighted()` function only checks that such an
#' attribute exists. (It does not even checks that it is a numeric edge
#' attribute.)
#'
#' Edge weights are used for different purposes by the different functions.
#' E.g. shortest path functions use it as the cost of the path; community
#' finding methods use it as the strength of the relationship between two
#' vertices, etc. Check the manual pages of the functions working with weighted
#' graphs for details.
#'
#' @param graph The input graph.
#' @return A logical scalar.
#' @author Gabor Csardi \email{csardi.gabor@@gmail.com}
#' @export
#' @keywords graphs
#' @examples
#'
#' g <- make_ring(10)
#' shortest_paths(g, 8, 2)
#' E(g)$weight <- seq_len(ecount(g))
#' shortest_paths(g, 8, 2)
#'
is_weighted <- function(graph) {
ensure_igraph(graph)
"weight" %in% edge_attr_names(graph)
}
#' @title Checks whether the graph has a vertex attribute called `type`.
#' @description It does not check whether the graph is bipartite in the
#' mathematical sense. Use [bipartite_mapping()] for that.
#' @family bipartite
#' @param graph The input graph
#' @export
is_bipartite <- function(graph) {
ensure_igraph(graph)
"type" %in% vertex_attr_names(graph)
}
#############
igraph.i.attribute.combination <- function(comb) {
if (is.function(comb)) {
comb <- list(comb)
}
comb <- as.list(comb)
if (
any(
!sapply(comb, function(x) {
is.function(x) || (is.character(x) && length(x) == 1)
})
)
) {
cli::cli_abort(
"Attribute combination element must be a function or character scalar."
)
}
if (is.null(names(comb))) {
names(comb) <- rep("", length(comb))
}
if (any(duplicated(names(comb)))) {
cli::cli_warn("Some attributes are duplicated")
}
comb <- lapply(comb, function(x) {
if (!is.character(x)) {
x
} else {
known <- data.frame(
n = c(
"ignore",
"sum",
"prod",
"min",
"max",
"random",
"first",
"last",
"mean",
"median",
"concat"
),
i = c(0, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12),
stringsAsFactors = FALSE
)
x <- pmatch(tolower(x), known[, 1])
if (is.na(x)) {
cli::cli_abort(
"Unknown/unambigous attribute combination specification."
)
}
known[, 2][x]
}
})
comb
}
#' How igraph functions handle attributes when the graph changes
#'
#' Many times, when the structure of a graph is modified, vertices/edges map of
#' the original graph map to vertices/edges in the newly created (modified)
#' graph. For example [simplify()] maps multiple edges to single
#' edges. igraph provides a flexible mechanism to specify what to do with the
#' vertex/edge attributes in these cases.
#'
#' The functions that support the combination of attributes have one or two
#' extra arguments called `vertex.attr.comb` and/or `edge.attr.comb`
#' that specify how to perform the mapping of the attributes. E.g.
#' [contract()] contracts many vertices into a single one, the
#' attributes of the vertices can be combined and stores as the vertex
#' attributes of the new graph.
#'
#' The specification of the combination of (vertex or edge) attributes can be
#' given as \enumerate{
#' \item a character scalar,
#' \item a function object or
#' \item a list of character scalars and/or function objects.
#' }
#'
#' If it is a character scalar, then it refers to one of the predefined
#' combinations, see their list below.
#'
#' If it is a function, then the given function is expected to perform the
#' combination. It will be called once for each new vertex/edge in the graph,
#' with a single argument: the attribute values of the vertices that map to
#' that single vertex.
#'
#' The third option, a list can be used to specify different combination
#' methods for different attributes. A named entry of the list corresponds to
#' the attribute with the same name. An unnamed entry (i.e. if the name is the
#' empty string) of the list specifies the default combination method. I.e.
#' \preformatted{list(weight="sum", "ignore")} specifies that the weight of the
#' new edge should be sum of the weights of the corresponding edges in the old
#' graph; and that the rest of the attributes should be ignored (=dropped).
#'
#' @family attributes
#' @name igraph-attribute-combination
#' @aliases attribute.combination
#' @section Predefined combination functions: The following combination
#' behaviors are predefined:
#' \describe{
#' \item{"ignore"}{
#' The attribute is ignored and dropped.
#' }
#' \item{"sum"}{
#' The sum of the attributes is calculated.
#' This does not work for character attributes and works for complex attributes
#' only if they have a `sum` generic defined.
#' (E.g. it works for sparse matrices from the `Matrix` package,
#' because they have a `sum` method.)
#' }
#' \item{"prod"}{
#' The product of the attributes is calculated.
#' This does not work for character attributes and works for complex attributes
#' only if they have a `prod` function defined.
#' }
#' \item{"min"}{
#' The minimum of the attributes is calculated and returned.
#' For character and complex attributes the standard R `min` function is used.
#' }
#' \item{"max"}{
#' The maximum of the attributes is calculated and returned.
#' For character and complex attributes the standard R `max` function is used.
#' }
#' \item{"random"}{
#' Chooses one of the supplied attribute values, uniformly randomly.
#' For character and complex attributes this is implemented by calling `sample`.
#' }
#' \item{"first"}{
#' Always chooses the first attribute value.
#' It is implemented by calling the [head()] function.
#' }
#' \item{"last"}{
#' Always chooses the last attribute value.
#' It is implemented by calling the [tail()] function.
#' }
#' \item{"mean"}{
#' The mean of the attributes is calculated and returned.
#' For character and complex attributes this simply calls the [mean()] function.
#' }
#' \item{"median"}{
#' The median of the attributes is selected.
#' Calls the R [median()] function for all attribute types.
#' }
#' \item{"concat"}{
#' Concatenate the attributes, using the [c()] function.
#' This results almost always a complex attribute.
#' }
#' }
#' @author Gabor Csardi \email{csardi.gabor@@gmail.com}
#' @seealso [graph_attr()], [vertex_attr()],
#' [edge_attr()] on how to use graph/vertex/edge attributes in
#' general. [igraph_options()] on igraph parameters.
#' @keywords graphs
#' @examples
#'
#' g <- make_graph(c(1, 2, 1, 2, 1, 2, 2, 3, 3, 4))
#' E(g)$weight <- 1:5
#'
#' ## print attribute values with the graph
#' igraph_options(print.graph.attributes = TRUE)
#' igraph_options(print.vertex.attributes = TRUE)
#' igraph_options(print.edge.attributes = TRUE)
#'
#' ## new attribute is the sum of the old ones
#' simplify(g, edge.attr.comb = "sum")
#'
#' ## collect attributes into a string
#' simplify(g, edge.attr.comb = toString)
#'
#' ## concatenate them into a vector, this creates a complex
#' ## attribute
#' simplify(g, edge.attr.comb = "concat")
#'
#' E(g)$name <- letters[seq_len(ecount(g))]
#'
#' ## both attributes are collected into strings
#' simplify(g, edge.attr.comb = toString)
#'
#' ## harmonic average of weights, names are dropped
#' simplify(g, edge.attr.comb = list(
#' weight = function(x) length(x) / sum(1 / x),
#' name = "ignore"
#' ))
NULL
#' Getting and setting graph attributes, shortcut
#'
#' The `$` operator is a shortcut to get and and set
#' graph attributes. It is shorter and just as readable as
#' [graph_attr()] and [set_graph_attr()].
#'
#' @param x An igraph graph
#' @param name Name of the attribute to get/set.
#'
#' @method $ igraph
#' @name igraph-dollar
#' @export
#' @family attributes
#' @examples
#' g <- make_ring(10)
#' g$name
#' g$name <- "10-ring"
#' g$name
`$.igraph` <- function(x, name) {
check_string(name)
graph_attr(x, name)
}
#' @param value New value of the graph attribute.
#'
#' @method $<- igraph
#' @name igraph-dollar
#' @export
`$<-.igraph` <- function(x, name, value) {
check_string(name)
set_graph_attr(x, name, value)
}
assert_named_list <- function(value) {
if (!is.list(value)) {
cli::cli_abort("{.arg value} must be a named list with unique names")
}
if (length(value) == 0) {
return()
}
if (!rlang::is_named(value) || anyDuplicated(names(value)) > 0) {
cli::cli_abort("{.arg value} must be a named list with unique names")
}
}
index_is_natural_sequence <- function(index, graph) {
length(index) == vcount(graph) && all(index == seq_len(vcount(graph)))
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.