We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 5c0a16d commit b84e731Copy full SHA for b84e731
R/tidy.R
@@ -15,10 +15,4 @@
15
#' fit(Class ~ funded_amnt + int_rate, data = lending_club) %>%
16
#' # tidying model object and passing arguments to broom:::tidy.glm
17
#' tidy(conf.int = TRUE, exponentiate = TRUE)
18
-tidy.model_fit <- function(x, ...) {
19
- tryCatch(generics::tidy(x$fit, ...),
20
- error = function(error) {
21
- cat("Error:", error$message)
22
- }
23
- )
24
-}
+tidy.model_fit <- function(x, ...) generics::tidy(x$fit, ...)
0 commit comments