|
11 | 11 | #' @name defunct |
12 | 12 | NULL |
13 | 13 |
|
14 | | -#' @usage # Deprecated in 0.5.0 ------------------------------------- |
15 | | -#' @name defunct |
16 | | -NULL |
17 | | - |
18 | | -#' @export |
19 | | -#' @rdname defunct |
20 | | -id <- function(.variables, drop = FALSE) { |
21 | | - lifecycle::deprecate_stop("0.5.0", "id()", "vctrs::vec_group_id()") |
22 | | -} |
23 | | - |
24 | | -#' @usage # Deprecated in 0.7.0 ------------------------------------- |
25 | | -#' @name defunct |
26 | | -NULL |
27 | | - |
28 | | -#' @export |
29 | | -#' @rdname defunct |
30 | | -failwith <- function(default = NULL, f, quiet = FALSE) { |
31 | | - lifecycle::deprecate_stop("0.7.0", "failwith()", "purrr::possibly()") |
32 | | -} |
33 | | - |
34 | | -#' @usage # Deprecated in 0.8.* ------------------------------------- |
35 | | -#' @name defunct |
36 | | -NULL |
37 | | - |
38 | | -#' @export |
39 | | -#' @rdname defunct |
40 | | -select_vars <- function(vars = chr(), ..., include = chr(), exclude = chr()) { |
41 | | - lifecycle::deprecate_stop( |
42 | | - "0.8.4", |
43 | | - "select_vars()", |
44 | | - "tidyselect::vars_select()" |
45 | | - ) |
46 | | -} |
47 | | -#' @export |
48 | | -#' @rdname defunct |
49 | | -rename_vars <- function(vars = chr(), ..., strict = TRUE) { |
50 | | - lifecycle::deprecate_stop( |
51 | | - "0.8.4", |
52 | | - "rename_vars()", |
53 | | - "tidyselect::vars_rename()" |
54 | | - ) |
55 | | -} |
56 | | -#' @export |
57 | | -#' @rdname defunct |
58 | | -select_var <- function(vars, var = -1) { |
59 | | - lifecycle::deprecate_stop("0.8.4", "select_var()", "tidyselect::vars_pull()") |
60 | | -} |
61 | | -#' @export |
62 | | -#' @rdname defunct |
63 | | -current_vars <- function(...) { |
64 | | - lifecycle::deprecate_stop( |
65 | | - "0.8.4", |
66 | | - "current_vars()", |
67 | | - "tidyselect::peek_vars()" |
68 | | - ) |
69 | | -} |
70 | | - |
71 | 14 | #' @usage # Deprecated in 1.0.0 ------------------------------------- |
72 | 15 | #' @name defunct |
73 | 16 | NULL |
|
0 commit comments