Skip to content

Commit 76f8215

Browse files
committed
Update reference index
1 parent 13797bd commit 76f8215

File tree

7 files changed

+18
-2
lines changed

7 files changed

+18
-2
lines changed

R/conditions.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -376,6 +376,7 @@ cnd_body.vctrs_error_incompatible_size <- function(cnd, ...) {
376376
#' deprecation warning. This is useful for transitioning your class
377377
#' to a stricter conversion scheme. The warning advises your users
378378
#' to wrap their code with `allow_lossy_cast()`.
379+
#' @keywords internal
379380
#' @export
380381
maybe_lossy_cast <- function(result, x, to,
381382
lossy = NULL,

R/partial-factor.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -4,6 +4,7 @@
44
#' result should be a factor that contains at least the specified levels.
55
#'
66
#' @inheritParams new_factor
7+
#' @keywords internal
78
#' @export
89
#' @examples
910
#' # Assert that `x` is a factor

R/partial-frame.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -4,6 +4,7 @@
44
#' types of only some of the columns in a data frame.
55
#'
66
#' @param ... Attributes of subclass
7+
#' @keywords internal
78
#' @export
89
#' @examples
910
#' pf <- partial_frame(x = double())

_pkgdown.yml

Lines changed: 12 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -24,19 +24,23 @@ reference:
2424
- vec_ptype
2525
- vec_size
2626
- vec_is
27+
- vec_is_list
2728
- vec_assert
2829

29-
- title: Casting and combining
30+
- title: Combining
3031
contents:
3132
- vec_c
3233
- vec_cbind
34+
- vec_rbind
35+
- name_spec
3336

3437
- title: Slicing and recycling
3538
contents:
3639
- vec_init
3740
- vec_slice
3841
- vec_assign
3942
- vec_recycle
43+
- vec_chop
4044

4145
- title: Equality and ordering
4246
contents:
@@ -66,6 +70,9 @@ reference:
6670
contents:
6771
- list_of
6872

73+
- title: User tools
74+
- "`%0%`"
75+
6976
- title: Developer tools
7077
contents:
7178
- vctr
@@ -76,11 +83,14 @@ reference:
7683
- vec_proxy_equal
7784
- vec_ptype_full
7885
- vec_ptype_finalise
86+
- df_ptype2
87+
- df_cast
88+
- tib_ptype2
89+
- tib_cast
7990
- "vctrs-conditions"
8091
- rcrd
8192
- fields
8293
- s3_register
83-
- vec_resize
8494
- vec_arith
8595
- vec_math
8696
- unspecified

man/maybe_lossy_cast.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/partial_factor.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/partial_frame.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)