29
29
# ' @inheritParams complete
30
30
# ' @export
31
31
complete_ <- function (data , cols , fill = list (), ... ) {
32
- lifecycle :: deprecate_warn(" 1.0.0" , " complete_()" , " complete()" )
32
+ lifecycle :: deprecate_warn(" 1.0.0" , " complete_()" , " complete()" , always = TRUE )
33
33
UseMethod(" complete_" )
34
34
}
35
35
# ' @export
@@ -41,7 +41,7 @@ complete_.data.frame <- function(data, cols, fill = list(), ...) {
41
41
# ' @rdname deprecated-se
42
42
# ' @export
43
43
drop_na_ <- function (data , vars ) {
44
- lifecycle :: deprecate_warn(" 1.0.0" , " drop_na_()" , " drop_na()" )
44
+ lifecycle :: deprecate_warn(" 1.0.0" , " drop_na_()" , " drop_na()" , always = TRUE )
45
45
UseMethod(" drop_na_" )
46
46
}
47
47
# ' @export
@@ -53,7 +53,7 @@ drop_na_.data.frame <- function(data, vars) {
53
53
# ' @param expand_cols Character vector of column names to be expanded.
54
54
# ' @export
55
55
expand_ <- function (data , dots , ... ) {
56
- lifecycle :: deprecate_warn(" 1.0.0" , " expand_()" , " expand()" )
56
+ lifecycle :: deprecate_warn(" 1.0.0" , " expand_()" , " expand()" , always = TRUE )
57
57
UseMethod(" expand_" )
58
58
}
59
59
# ' @export
@@ -65,14 +65,14 @@ expand_.data.frame <- function(data, dots, ...) {
65
65
# ' @param x For `nesting_` and `crossing_` a list of variables.
66
66
# ' @export
67
67
crossing_ <- function (x ) {
68
- lifecycle :: deprecate_warn(" 1.0.0" , " crossing_()" , " crossing()" )
68
+ lifecycle :: deprecate_warn(" 1.0.0" , " crossing_()" , " crossing()" , always = TRUE )
69
69
x <- compat_lazy_dots(x , caller_env())
70
70
crossing(!!! x )
71
71
}
72
72
# ' @rdname deprecated-se
73
73
# ' @export
74
74
nesting_ <- function (x ) {
75
- lifecycle :: deprecate_warn(" 1.2.0" , " nesting_()" , " nesting()" )
75
+ lifecycle :: deprecate_warn(" 1.2.0" , " nesting_()" , " nesting()" , always = TRUE )
76
76
x <- compat_lazy_dots(x , caller_env())
77
77
nesting(!!! x )
78
78
}
@@ -82,7 +82,7 @@ nesting_ <- function(x) {
82
82
# ' @export
83
83
extract_ <- function (data , col , into , regex = " ([[:alnum:]]+)" , remove = TRUE ,
84
84
convert = FALSE , ... ) {
85
- lifecycle :: deprecate_warn(" 1.0.0" , " extract_()" , " extract()" )
85
+ lifecycle :: deprecate_warn(" 1.0.0" , " extract_()" , " extract()" , always = TRUE )
86
86
UseMethod(" extract_" )
87
87
}
88
88
# ' @export
@@ -104,7 +104,7 @@ extract_.data.frame <- function(data, col, into, regex = "([[:alnum:]]+)",
104
104
# ' @param fill_cols Character vector of column names.
105
105
# ' @export
106
106
fill_ <- function (data , fill_cols , .direction = c(" down" , " up" )) {
107
- lifecycle :: deprecate_warn(" 1.2.0" , " fill_()" , " fill()" )
107
+ lifecycle :: deprecate_warn(" 1.2.0" , " fill_()" , " fill()" , always = TRUE )
108
108
UseMethod(" fill_" )
109
109
}
110
110
# ' @export
@@ -123,7 +123,7 @@ fill_.data.frame <- function(data, fill_cols, .direction = c("down", "up", "down
123
123
# ' @export
124
124
gather_ <- function (data , key_col , value_col , gather_cols , na.rm = FALSE ,
125
125
convert = FALSE , factor_key = FALSE ) {
126
- lifecycle :: deprecate_warn(" 1.2.0" , " gather_()" , " gather()" )
126
+ lifecycle :: deprecate_warn(" 1.2.0" , " gather_()" , " gather()" , always = TRUE )
127
127
UseMethod(" gather_" )
128
128
}
129
129
# ' @export
@@ -149,7 +149,7 @@ gather_.data.frame <- function(data, key_col, value_col, gather_cols,
149
149
# ' @keywords internal
150
150
# ' @export
151
151
nest_ <- function (... ) {
152
- lifecycle :: deprecate_stop(" 1.0.0" , " nest_()" , " nest()" )
152
+ lifecycle :: deprecate_stop(" 1.0.0" , " nest_()" , " nest()" , always = TRUE )
153
153
}
154
154
155
155
# ' @rdname deprecated-se
@@ -172,7 +172,7 @@ separate_rows_.data.frame <- function(data, cols, sep = "[^[:alnum:].]+",
172
172
# ' @export
173
173
separate_ <- function (data , col , into , sep = " [^[:alnum:]]+" , remove = TRUE ,
174
174
convert = FALSE , extra = " warn" , fill = " warn" , ... ) {
175
- lifecycle :: deprecate_warn(" 1.2.0" , " separate_()" , " separate()" )
175
+ lifecycle :: deprecate_warn(" 1.2.0" , " separate_()" , " separate()" , always = TRUE )
176
176
UseMethod(" separate_" )
177
177
}
178
178
# ' @export
@@ -197,7 +197,7 @@ separate_.data.frame <- function(data, col, into, sep = "[^[:alnum:]]+",
197
197
# ' @export
198
198
spread_ <- function (data , key_col , value_col , fill = NA , convert = FALSE ,
199
199
drop = TRUE , sep = NULL ) {
200
- lifecycle :: deprecate_warn(" 1.2.0" , " spread_()" , " spread()" )
200
+ lifecycle :: deprecate_warn(" 1.2.0" , " spread_()" , " spread()" , always = TRUE )
201
201
UseMethod(" spread_" )
202
202
}
203
203
# ' @export
@@ -221,7 +221,7 @@ spread_.data.frame <- function(data, key_col, value_col, fill = NA,
221
221
# ' @param from Names of existing columns as character vector
222
222
# ' @export
223
223
unite_ <- function (data , col , from , sep = " _" , remove = TRUE ) {
224
- lifecycle :: deprecate_warn(" 1.2.0" , " unite_()" , " unite()" )
224
+ lifecycle :: deprecate_warn(" 1.2.0" , " unite_()" , " unite()" , always = TRUE )
225
225
UseMethod(" unite_" )
226
226
}
227
227
# ' @export
0 commit comments