Skip to content

Commit

Permalink
restore new_names arg
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Jul 22, 2021
1 parent 1e29614 commit c1bc951
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@

To be release as broom 0.7.9.

* Fixed confidence intervals in `tidy.crr()` which are exponentiated when `exponentiate = F` (`#1023` by `@leejasme`)
* Fixed confidence intervals in `tidy.crr()`, which were previously exponentiated when `exponentiate = FALSE` (`#1023` by `@leejasme`)

# broom 0.7.8

Expand Down
2 changes: 1 addition & 1 deletion R/cmprsk-tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -41,7 +41,7 @@ tidy.crr <- function(x, exponentiate = FALSE, conf.int = FALSE,
if (conf.int) {
ci <- as_tidy_tibble(
log(s$conf.int),
new_names = c("estimate", "estimate_neg", "conf.low", "conf.high"))[, -c(2, 3)]
new_names = c("estimate_exp", "estimate_neg_exp", "conf.low", "conf.high"))[, -c(2, 3)]
ret <- dplyr::left_join(ret, ci, by = "term")
}

Expand Down

0 comments on commit c1bc951

Please sign in to comment.