Skip to content

Commit

Permalink
Update reference index
Browse files Browse the repository at this point in the history
  • Loading branch information
lionel- committed May 7, 2020
1 parent 13797bd commit 76f8215
Show file tree
Hide file tree
Showing 7 changed files with 18 additions and 2 deletions.
1 change: 1 addition & 0 deletions R/conditions.R
Original file line number Diff line number Diff line change
Expand Up @@ -376,6 +376,7 @@ cnd_body.vctrs_error_incompatible_size <- function(cnd, ...) {
#' deprecation warning. This is useful for transitioning your class
#' to a stricter conversion scheme. The warning advises your users
#' to wrap their code with `allow_lossy_cast()`.
#' @keywords internal
#' @export
maybe_lossy_cast <- function(result, x, to,
lossy = NULL,
Expand Down
1 change: 1 addition & 0 deletions R/partial-factor.R
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@
#' result should be a factor that contains at least the specified levels.
#'
#' @inheritParams new_factor
#' @keywords internal
#' @export
#' @examples
#' # Assert that `x` is a factor
Expand Down
1 change: 1 addition & 0 deletions R/partial-frame.R
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@
#' types of only some of the columns in a data frame.
#'
#' @param ... Attributes of subclass
#' @keywords internal
#' @export
#' @examples
#' pf <- partial_frame(x = double())
Expand Down
14 changes: 12 additions & 2 deletions _pkgdown.yml
Original file line number Diff line number Diff line change
Expand Up @@ -24,19 +24,23 @@ reference:
- vec_ptype
- vec_size
- vec_is
- vec_is_list
- vec_assert

- title: Casting and combining
- title: Combining
contents:
- vec_c
- vec_cbind
- vec_rbind
- name_spec

- title: Slicing and recycling
contents:
- vec_init
- vec_slice
- vec_assign
- vec_recycle
- vec_chop

- title: Equality and ordering
contents:
Expand Down Expand Up @@ -66,6 +70,9 @@ reference:
contents:
- list_of

- title: User tools
- "`%0%`"

- title: Developer tools
contents:
- vctr
Expand All @@ -76,11 +83,14 @@ reference:
- vec_proxy_equal
- vec_ptype_full
- vec_ptype_finalise
- df_ptype2
- df_cast
- tib_ptype2
- tib_cast
- "vctrs-conditions"
- rcrd
- fields
- s3_register
- vec_resize
- vec_arith
- vec_math
- unspecified
Expand Down
1 change: 1 addition & 0 deletions man/maybe_lossy_cast.Rd

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

1 change: 1 addition & 0 deletions man/partial_factor.Rd

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

1 change: 1 addition & 0 deletions man/partial_frame.Rd

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

0 comments on commit 76f8215

Please sign in to comment.