Skip to content

Commit 3dd5747

Browse files
remove example to avoid broom dependency
1 parent 7eafd3f commit 3dd5747

File tree

2 files changed

+0
-18
lines changed

2 files changed

+0
-18
lines changed

R/tidy.R

Lines changed: 0 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -6,13 +6,4 @@
66
#'
77
#' @return a tibble
88
#' @export
9-
#'
10-
#' @examples
11-
#' library(broom)
12-
#'
13-
#' logistic_reg() %>%
14-
#' set_engine("glm") %>%
15-
#' fit(Class ~ funded_amnt + int_rate, data = lending_club) %>%
16-
#' # tidying model object and passing arguments to broom:::tidy.glm
17-
#' tidy(exponentiate = TRUE)
189
tidy.model_fit <- function(x, ...) generics::tidy(x$fit, ...)

man/tidy.model_fit.Rd

Lines changed: 0 additions & 9 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)