Skip to content

Commit

Permalink
Suggestion from code review
Browse files Browse the repository at this point in the history
  • Loading branch information
hfrick committed Dec 20, 2023
1 parent 5be1968 commit 1614ab6
Showing 1 changed file with 2 additions and 3 deletions.
5 changes: 2 additions & 3 deletions R/proportional_hazards-glmnet.R
Original file line number Diff line number Diff line change
Expand Up @@ -621,12 +621,11 @@ survival_prob_coxnet <- function(object,
}

if (multi) {
res <- tibble::tibble(
res_formatted <- tibble::tibble(
penalty = penalty,
res_patched = res_patched
) %>%
tidyr::unnest(cols = res_patched)
res_formatted <- res %>%
tidyr::unnest(cols = res_patched) %>%
keep_cols(output, keep_penalty = TRUE) %>%
tidyr::nest(.pred = c(-.row)) %>%
dplyr::select(-.row)
Expand Down

0 comments on commit 1614ab6

Please sign in to comment.