Skip to content

Commit

Permalink
transition rlang::inform() to cli::cli_inform()
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Oct 21, 2024
1 parent cf41345 commit 0a5b530
Showing 1 changed file with 10 additions and 2 deletions.
12 changes: 10 additions & 2 deletions R/lmtest.R
Original file line number Diff line number Diff line change
Expand Up @@ -114,8 +114,16 @@ glance.coeftest <- function(x, ...) {
logLik = sprintf("%.3f", logLik(x)), AIC = AIC(x),
BIC = BIC(x), nobs = nobs(x)
)
rlang::inform("Original model not retained as part of coeftest object. For additional model summary information (r.squared, df, etc.), consider passing `glance.coeftest()` an object where the underlying model has been saved, i.e.`lmtest::coeftest(..., save = TRUE)`.",
.frequency = "once", .frequency_id = "glance_coeftest_inform"
cli::cli_inform(
c(
"Original model not retained as part of coeftest object.",
"i" = "For additional model summary information (r.squared, df, etc.),
consider passing {.fn glance.coeftest} an object where the
underlying model has been saved, i.e.
{.code lmtest::coeftest(..., save = TRUE)}."
),
.frequency = "once",
.frequency_id = "glance_coeftest_inform"
)
}

Expand Down

0 comments on commit 0a5b530

Please sign in to comment.