Skip to content

Commit

Permalink
urge caution with untested tidiers
Browse files Browse the repository at this point in the history
related to #1200, #1193
  • Loading branch information
simonpcouch committed May 8, 2024
1 parent 2da3cce commit d8baa1e
Show file tree
Hide file tree
Showing 2 changed files with 44 additions and 2 deletions.
36 changes: 36 additions & 0 deletions R/emmeans-tidiers.R
Expand Up @@ -81,6 +81,15 @@
#' @seealso [tidy()], `emmeans::ref_grid()`, `emmeans::emmeans()`,
#' `emmeans::contrast()`
tidy.lsmobj <- function(x, conf.int = FALSE, conf.level = .95, ...) {
lifecycle::deprecate_soft(
"1.0.6",
I("tidying a `lsmobj` object"),
details = c(
"i" = "broom no longer tests support for emmeans output as the package
requires an incompatibly recent R version.",
"!" = "Please interpret output with caution."
)
)
check_ellipses("exponentiate", "tidy", "lsmobj", ...)

tidy_emmeans(x, infer = c(conf.int, TRUE), level = conf.level, ...)
Expand All @@ -107,6 +116,15 @@ tidy.lsmobj <- function(x, conf.int = FALSE, conf.level = .95, ...) {
#' @seealso [tidy()], `emmeans::ref_grid()`, `emmeans::emmeans()`,
#' `emmeans::contrast()`
tidy.ref.grid <- function(x, conf.int = FALSE, conf.level = .95, ...) {
lifecycle::deprecate_soft(
"1.0.6",
I("tidying a `ref.grid` object"),
details = c(
"i" = "broom no longer tests support for emmeans output as the package
requires an incompatibly recent R version.",
"!" = "Please interpret output with caution."
)
)
check_ellipses("exponentiate", "tidy", "ref.grid", ...)

tidy_emmeans(x, infer = c(conf.int, TRUE), level = conf.level, ...)
Expand All @@ -133,6 +151,15 @@ tidy.ref.grid <- function(x, conf.int = FALSE, conf.level = .95, ...) {
#' @seealso [tidy()], `emmeans::ref_grid()`, `emmeans::emmeans()`,
#' `emmeans::contrast()`
tidy.emmGrid <- function(x, conf.int = FALSE, conf.level = .95, ...) {
lifecycle::deprecate_soft(
"1.0.6",
I("tidying a `emmGrid` object"),
details = c(
"i" = "broom no longer tests support for emmeans output as the package
requires an incompatibly recent R version.",
"!" = "Please interpret output with caution."
)
)
check_ellipses("exponentiate", "tidy", "emmGrid", ...)

tidy_emmeans(x, infer = c(conf.int, TRUE), level = conf.level, ...)
Expand Down Expand Up @@ -168,6 +195,15 @@ tidy.emmGrid <- function(x, conf.int = FALSE, conf.level = .95, ...) {
#' `emmeans::contrast()`

tidy.summary_emm <- function(x, null.value = NULL, ...) {
lifecycle::deprecate_soft(
"1.0.6",
I("tidying a `summary_emm` object"),
details = c(
"i" = "broom no longer tests support for emmeans output as the package
requires an incompatibly recent R version.",
"!" = "Please interpret output with caution."
)
)
check_ellipses("exponentiate", "tidy", "summary_emm", ...)

tidy_emmeans_summary(x, null.value = null.value)
Expand Down
10 changes: 8 additions & 2 deletions R/margins-tidiers.R
Expand Up @@ -75,7 +75,10 @@ tidy.margins <- function(x, conf.int = FALSE, conf.level = 0.95, ...) {
lifecycle::deprecate_soft(
"1.0.6",
I("tidying a `margins` object"),
details = "margins was removed from CRAN in April 2024 and its tidiers are thus untested."
details = c(
"i" = "margins was removed from CRAN in April 2024 and its tidiers are thus untested.",
"!" = "Please interpret output with caution."
)
)

check_ellipses("exponentiate", "tidy", "margins", ...)
Expand Down Expand Up @@ -147,7 +150,10 @@ glance.margins <- function(x, ...) {
lifecycle::deprecate_soft(
"1.0.6",
I("tidying a `margins` object"),
details = "margins was removed from CRAN in April 2024 and its tidiers are thus untested."
details = c(
"i" = "margins was removed from CRAN in April 2024 and its tidiers are thus untested.",
"!" = "Please interpret output with caution."
)
)

orig_mod_call <- attributes(x)$call
Expand Down

0 comments on commit d8baa1e

Please sign in to comment.