Skip to content

Commit 155ffde

Browse files
authored
replace 3.6.0 with 4.0.0 (#6707)
1 parent f94904a commit 155ffde

File tree

2 files changed

+6
-6
lines changed

2 files changed

+6
-6
lines changed

R/fortify-map.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -28,7 +28,7 @@
2828
#' }
2929
fortify.map <- function(model, data, ...) {
3030
lifecycle::deprecate_warn(
31-
"3.6.0", I("`fortify(<map>)`"), "map_data()"
31+
"4.0.0", I("`fortify(<map>)`"), "map_data()"
3232
)
3333
df <- data_frame0(
3434
long = model$x,

R/fortify-models.R

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -39,7 +39,7 @@
3939
#' geom_point()
4040
fortify.lm <- function(model, data = model$model, ...) {
4141
lifecycle::deprecate_warn(
42-
"3.6.0", I("`fortify(<lm>)`"), I("`broom::augment(<lm>)`")
42+
"4.0.0", I("`fortify(<lm>)`"), I("`broom::augment(<lm>)`")
4343
)
4444
infl <- stats::influence(model, do.coef = FALSE)
4545
data$.hat <- infl$hat
@@ -102,7 +102,7 @@ NULL
102102
#' @export
103103
fortify.glht <- function(model, data, ...) {
104104
lifecycle::deprecate_warn(
105-
"3.6.0", I("`fortify(<glht>)`"), I("`broom::tidy(<glht>)`")
105+
"4.0.0", I("`fortify(<glht>)`"), I("`broom::tidy(<glht>)`")
106106
)
107107
base::data.frame(
108108
lhs = rownames(model$linfct),
@@ -118,7 +118,7 @@ fortify.glht <- function(model, data, ...) {
118118
#' @export
119119
fortify.confint.glht <- function(model, data, ...) {
120120
lifecycle::deprecate_warn(
121-
"3.6.0", I("`fortify(<confint.glht>)`"), I("`broom::tidy(<confint.glht>)`")
121+
"4.0.0", I("`fortify(<confint.glht>)`"), I("`broom::tidy(<confint.glht>)`")
122122
)
123123
coef <- model$confint
124124
colnames(coef) <- to_lower_ascii(colnames(coef))
@@ -137,7 +137,7 @@ fortify.confint.glht <- function(model, data, ...) {
137137
#' @export
138138
fortify.summary.glht <- function(model, data, ...) {
139139
lifecycle::deprecate_warn(
140-
"3.6.0", I("`fortify(<summary.glht>)`"), I("`broom::tidy(<summary.glht>)`")
140+
"4.0.0", I("`fortify(<summary.glht>)`"), I("`broom::tidy(<summary.glht>)`")
141141
)
142142
coef <- as.data.frame(
143143
model$test[c("coefficients", "sigma", "tstat", "pvalues")])
@@ -158,7 +158,7 @@ fortify.summary.glht <- function(model, data, ...) {
158158
#' @export
159159
fortify.cld <- function(model, data, ...) {
160160
lifecycle::deprecate_warn(
161-
"3.6.0", I("`fortify(<summary.glht>)`"), I("`broom::tidy(<summary.glht>)`")
161+
"4.0.0", I("`fortify(<summary.glht>)`"), I("`broom::tidy(<summary.glht>)`")
162162
)
163163
base::data.frame(
164164
lhs = names(model$mcletters$Letters),

0 commit comments

Comments
 (0)