3939# ' geom_point()
4040fortify.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
102102# ' @export
103103fortify.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
119119fortify.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
138138fortify.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
159159fortify.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