Skip to content

Commit 7eafd3f

Browse files
remove conf.int to avoid MASS dependency
1 parent b84e731 commit 7eafd3f

File tree

2 files changed

+2
-2
lines changed

2 files changed

+2
-2
lines changed

R/tidy.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -14,5 +14,5 @@
1414
#' set_engine("glm") %>%
1515
#' fit(Class ~ funded_amnt + int_rate, data = lending_club) %>%
1616
#' # tidying model object and passing arguments to broom:::tidy.glm
17-
#' tidy(conf.int = TRUE, exponentiate = TRUE)
17+
#' tidy(exponentiate = TRUE)
1818
tidy.model_fit <- function(x, ...) generics::tidy(x$fit, ...)

man/tidy.model_fit.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)