#' @templateVar class glmRob
#' @template title_desc_tidy
#'
#' @param x A `glmRob` object returned from [robust::glmRob()].
#' @template param_unused_dots
#'
#' @details For tidiers for robust models from the \pkg{MASS} package see
#' [tidy.rlm()].
#'
#' @examplesIf rlang::is_installed("robust")
#'
#' # load libraries for models and data
#' library(robust)
#'
#' # fit model
#' gm <- glmRob(am ~ wt, data = mtcars, family = "binomial")
#'
#' # summarize model fit with tidiers
#' tidy(gm)
#' glance(gm)
#'
#' @export
#' @family robust tidiers
#' @seealso [robust::glmRob()]
tidy.glmRob <- function(x, ...) {
co <- stats::coef(summary(x))
ret <- as_tibble(co, rownames = "term")
names(ret) <- c("term", "estimate", "std.error", "statistic", "p.value")
ret
}
#' @templateVar class glmRob
#' @template title_desc_augment
#'
#' @param x Unused.
#' @param ... Unused.
#'
#' @export
augment.glmRob <- function(x, ...) {
cli::cli_abort(c(
"{.fn augment.glmRob} has been deprecated as the {.pkg robust} package
doesn't provide the functionality necessary to implement
an augment method.",
"i" = "Please see the augment method for {.cls glmrob} objects from
{.pkg robustbase}."
))
invisible(TRUE)
}
#' @templateVar class glmRob
#' @template title_desc_glance
#'
#' @inherit tidy.glmRob params examples
#' @template param_unused_dots
#'
#' @evalRd return_glance(
#' "deviance",
#' "sigma",
#' "null.deviance",
#' "df.residual",
#' "nobs"
#' )
#'
#' @export
#' @family robust tidiers
#' @seealso [robust::glmRob()]
#'
glance.glmRob <- function(x, ...) {
as_glance_tibble(
deviance = x$deviance,
sigma = stats::sigma(x),
null.deviance = x$null.deviance,
df.residual = stats::df.residual(x),
nobs = stats::nobs(x),
na_types = "rrrii"
)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.