Skip to content

Commit 6e09cc4

Browse files
committed
throw deprecation warnings
1 parent 85baeb9 commit 6e09cc4

File tree

2 files changed

+15
-0
lines changed

2 files changed

+15
-0
lines changed

R/fortify-lm.R

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -79,6 +79,9 @@
7979
#' geom_point(aes(size = .cooksd / .hat)) +
8080
#' scale_size_area()
8181
fortify.lm <- function(model, data = model$model, ...) {
82+
lifecycle::deprecate_warn(
83+
"3.6.0", I("`fortify(<lm>)`"), I("`broom::augment(<lm>)`")
84+
)
8285
infl <- stats::influence(model, do.coef = FALSE)
8386
data$.hat <- infl$hat
8487
data$.sigma <- infl$sigma

R/fortify-multcomp.R

Lines changed: 12 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -39,6 +39,9 @@ NULL
3939
#' @rdname fortify-multcomp
4040
#' @export
4141
fortify.glht <- function(model, data, ...) {
42+
lifecycle::deprecate_warn(
43+
"3.6.0", I("`fortify(<glht>)`"), I("`broom::tidy(<glht>)`")
44+
)
4245
base::data.frame(
4346
lhs = rownames(model$linfct),
4447
rhs = model$rhs,
@@ -52,6 +55,9 @@ fortify.glht <- function(model, data, ...) {
5255
#' @method fortify confint.glht
5356
#' @export
5457
fortify.confint.glht <- function(model, data, ...) {
58+
lifecycle::deprecate_warn(
59+
"3.6.0", I("`fortify(<confint.glht>)`"), I("`broom::tidy(<confint.glht>)`")
60+
)
5561
coef <- model$confint
5662
colnames(coef) <- to_lower_ascii(colnames(coef))
5763

@@ -68,6 +74,9 @@ fortify.confint.glht <- function(model, data, ...) {
6874
#' @rdname fortify-multcomp
6975
#' @export
7076
fortify.summary.glht <- function(model, data, ...) {
77+
lifecycle::deprecate_warn(
78+
"3.6.0", I("`fortify(<summary.glht>)`"), I("`broom::tidy(<summary.glht>)`")
79+
)
7180
coef <- as.data.frame(
7281
model$test[c("coefficients", "sigma", "tstat", "pvalues")])
7382
names(coef) <- c("estimate", "se", "t", "p")
@@ -86,6 +95,9 @@ fortify.summary.glht <- function(model, data, ...) {
8695
#' @rdname fortify-multcomp
8796
#' @export
8897
fortify.cld <- function(model, data, ...) {
98+
lifecycle::deprecate_warn(
99+
"3.6.0", I("`fortify(<summary.glht>)`"), I("`broom::tidy(<summary.glht>)`")
100+
)
89101
base::data.frame(
90102
lhs = names(model$mcletters$Letters),
91103
letters = model$mcletters$Letters,

0 commit comments

Comments
 (0)