Skip to content

Commit

Permalink
docs: add code finding duplicate seealso, and use it (#1270)
Browse files Browse the repository at this point in the history
  • Loading branch information
aviator-app[bot] authored Feb 27, 2024
2 parents 2f477d7 + 1f62bcf commit 1a77d51
Show file tree
Hide file tree
Showing 21 changed files with 21 additions and 344 deletions.
1 change: 0 additions & 1 deletion R/components.R
Original file line number Diff line number Diff line change
Expand Up @@ -216,7 +216,6 @@ decompose <- function(graph, mode = c("weak", "strong"), max.comps = NA,
articulation_points <- articulation_points_impl

#' @rdname articulation_points
#' @family components
#' @export
bridges <- bridges_impl

Expand Down
8 changes: 0 additions & 8 deletions R/games.R
Original file line number Diff line number Diff line change
Expand Up @@ -611,7 +611,6 @@ sample_gnp <- function(n, p, directed = FALSE, loops = FALSE) {

#' @rdname sample_gnp
#' @param ... Passed to `sample_gnp()`.
#' @family games
#' @export
gnp <- function(...) constructor_spec(sample_gnp, ...)

Expand Down Expand Up @@ -667,7 +666,6 @@ sample_gnm <- function(n, m, directed = FALSE, loops = FALSE) {

#' @rdname sample_gnm
#' @param ... Passed to `sample_gnm()`.
#' @family games
#' @export
gnm <- function(...) constructor_spec(sample_gnm, ...)

Expand Down Expand Up @@ -862,7 +860,6 @@ sample_degseq <- function(out.deg, in.deg = NULL,
#' @param deterministic Whether the construction should be deterministic
#' @param ... Passed to `realize_degseq()` if \sQuote{deterministic} is true,
#' or to `sample_degseq()` otherwise.
#' @family games
#' @export
degseq <- function(..., deterministic = FALSE) {
constructor_spec(
Expand Down Expand Up @@ -913,7 +910,6 @@ sample_growing <- function(n, m = 1, directed = TRUE, citation = FALSE) {

#' @rdname sample_growing
#' @param ... Passed to `sample_growing()`.
#' @family games
#' @export
growing <- function(...) constructor_spec(sample_growing, ...)

Expand Down Expand Up @@ -1112,7 +1108,6 @@ sample_pa_age <- function(n, pa.exp, aging.exp, m = NULL, aging.bin = 300,

#' @rdname sample_pa_age
#' @param ... Passed to `sample_pa_age()`.
#' @family games
#' @export
pa_age <- function(...) constructor_spec(sample_pa_age, ...)

Expand Down Expand Up @@ -1263,7 +1258,6 @@ sample_grg <- function(nodes, radius, torus = FALSE, coords = FALSE) {

#' @rdname sample_grg
#' @param ... Passed to `sample_grg()`.
#' @family games
#' @export
grg <- function(...) constructor_spec(sample_grg, ...)

Expand Down Expand Up @@ -1489,7 +1483,6 @@ sample_smallworld <- function(dim, size, nei, p, loops = FALSE,

#' @rdname sample_smallworld
#' @param ... Passed to `sample_smallworld()`.
#' @family games
#' @export
smallworld <- function(...) constructor_spec(sample_smallworld, ...)

Expand Down Expand Up @@ -1696,7 +1689,6 @@ sample_bipartite <- function(n1, n2, type = c("gnp", "gnm"), p, m,

#' @rdname sample_bipartite
#' @param ... Passed to `sample_bipartite()`.
#' @family games
#' @export
bipartite <- function(...) constructor_spec(sample_bipartite, ...)

Expand Down
1 change: 0 additions & 1 deletion R/iterators.R
Original file line number Diff line number Diff line change
Expand Up @@ -1122,7 +1122,6 @@ simple_es_index <- function(x, i, na_ok = FALSE) {
#' @name igraph-es-attributes
#'
#' @export
#' @family vertex and edge sequences
#' @examples
#' # color edges of the largest component
#' largest_comp <- function(graph) {
Expand Down
4 changes: 0 additions & 4 deletions R/operators.R
Original file line number Diff line number Diff line change
Expand Up @@ -873,7 +873,6 @@ edge <- function(...) {
structure(list(...), class = "igraph.edge")
}

#' @family functions for manipulating graph structure
#' @export
#' @rdname edge
edges <- edge
Expand Down Expand Up @@ -910,7 +909,6 @@ vertex <- function(...) {
structure(list(...), class = "igraph.vertex")
}

#' @family functions for manipulating graph structure
#' @export
#' @rdname vertex
vertices <- vertex
Expand Down Expand Up @@ -1236,7 +1234,6 @@ rep.igraph <- function(x, n, mark = TRUE, ...) {

#' @rdname rep.igraph
#' @method * igraph
#' @family functions for manipulating graph structure
#' @export
`*.igraph` <- function(x, n) {
if (!is_igraph(x) && is_igraph(n)) {
Expand Down Expand Up @@ -1275,6 +1272,5 @@ reverse_edges <- reverse_edges_impl
#' @rdname reverse_edges
#' @param x The input graph.
#' @method t igraph
#' @family functions for manipulating graph structure
#' @export
t.igraph <- function(x) reverse_edges(x)
1 change: 0 additions & 1 deletion R/plot.R
Original file line number Diff line number Diff line change
Expand Up @@ -522,7 +522,6 @@ plot.igraph <- function(x,
#' @family plot
#' @export
#' @keywords graphs
#' @family plot
#' @export
#' @examples
#'
Expand Down
6 changes: 0 additions & 6 deletions man/articulation_points.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

25 changes: 0 additions & 25 deletions man/edge.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

12 changes: 0 additions & 12 deletions man/igraph-es-attributes.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

25 changes: 0 additions & 25 deletions man/rep.igraph.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

25 changes: 0 additions & 25 deletions man/reverse_edges.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 0 additions & 3 deletions man/rglplot.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

26 changes: 0 additions & 26 deletions man/sample_bipartite.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

26 changes: 0 additions & 26 deletions man/sample_degseq.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

26 changes: 0 additions & 26 deletions man/sample_gnm.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

26 changes: 0 additions & 26 deletions man/sample_gnp.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

Loading

0 comments on commit 1a77d51

Please sign in to comment.