Skip to content

Commit

Permalink
fix doc issue
Browse files Browse the repository at this point in the history
  • Loading branch information
emitanaka committed Sep 3, 2023
1 parent cdbe2cb commit cc5b7ce
Show file tree
Hide file tree
Showing 8 changed files with 17 additions and 14 deletions.
6 changes: 2 additions & 4 deletions R/attrs.R
Original file line number Diff line number Diff line change
Expand Up @@ -31,16 +31,14 @@ fct_attrs <- function(.levels, ...) {

#' Setting the traits of the levels
#'
#' Use this function to create a "vector" of levels. The vector is actually comprised of a
#' data frame with a column `labels` and other columns with corresponding level attribute (if any).
#'
#' @param levels A vector that either denotes the index number or short name of the levels.
#' @param value A vector of the level values.
#' @param data A list or data frame of the same size as the `levels`.
#' @param ... Name-value pair denoting other level attributes. The value should be the same
#' length as `levels` or a single value.
#' @importFrom vctrs new_rcrd vec_data
#' @examples
#' lvl_attrs(c("A", "B"))
#' lvls(c("A", "B"))
#' @return An edbl_lvls object.
#' @export
lvls <- function(value = NULL, data = NULL, ...) {
Expand Down
2 changes: 2 additions & 0 deletions R/design.R
Original file line number Diff line number Diff line change
Expand Up @@ -84,6 +84,7 @@ NULL
unname(unlist(lapply(unclass(x), function(.x) .x[[name]])))
}

#' @param i The index.
#' @rdname extract-lvl-nodes
#' @export
"[.edbl_lnodes" <- function(x, i, ...) {
Expand All @@ -95,6 +96,7 @@ NULL
}
}

#' @param value The value to replace with.
#' @rdname extract-lvl-nodes
#' @export
"[<-.edbl_lnodes" <- function(x, i, ..., value) {
Expand Down
1 change: 1 addition & 0 deletions R/graph-input.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,6 +3,7 @@
#'
#' @param input An input.
#' @param prov A provenance object.
#' @param ... Unused.
graph_input <- function(input, prov, ...) {
UseMethod("graph_input")
}
Expand Down
3 changes: 1 addition & 2 deletions R/graph.R
Original file line number Diff line number Diff line change
Expand Up @@ -31,13 +31,12 @@ activate_provenance <- function(.edibble,

#' Get the node or edge data from an edibble design
#'
#' @param edibble An edibble object.
#' @param x An edibble object.
#' @family design manipulators
#' @name design_data
NULL

#' @rdname design_data
#' @param x An object.
#' @export
fct_nodes <- function(x) {
prov <- activate_provenance(x)
Expand Down
4 changes: 1 addition & 3 deletions man/design_data.Rd

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

4 changes: 4 additions & 0 deletions man/extract-lvl-nodes.Rd

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

2 changes: 2 additions & 0 deletions man/graph_input.Rd

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

9 changes: 4 additions & 5 deletions man/lvls.Rd

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

0 comments on commit cc5b7ce

Please sign in to comment.