Skip to content

Commit b84e731

Browse files
remove trycatch
1 parent 5c0a16d commit b84e731

File tree

1 file changed

+1
-7
lines changed

1 file changed

+1
-7
lines changed

R/tidy.R

Lines changed: 1 addition & 7 deletions
Original file line numberDiff line numberDiff line change
@@ -15,10 +15,4 @@
1515
#' fit(Class ~ funded_amnt + int_rate, data = lending_club) %>%
1616
#' # tidying model object and passing arguments to broom:::tidy.glm
1717
#' 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-
}
18+
tidy.model_fit <- function(x, ...) generics::tidy(x$fit, ...)

0 commit comments

Comments
 (0)