Skip to content

Commit

Permalink
Merge pull request #479 from tidymodels/bring-survival-back
Browse files Browse the repository at this point in the history
Bring survival metrics back back
  • Loading branch information
EmilHvitfeldt committed Jan 18, 2024
2 parents 81e2cc6 + aa4a6b4 commit 6104423
Show file tree
Hide file tree
Showing 11 changed files with 14 additions and 10 deletions.
1 change: 0 additions & 1 deletion R/surv-brier_survival.R
Original file line number Diff line number Diff line change
Expand Up @@ -63,7 +63,6 @@
#' truth = surv_obj,
#' .pred
#' )
#' @keywords internal
#' @export
brier_survival <- function(data, ...) {
UseMethod("brier_survival")
Expand Down
1 change: 0 additions & 1 deletion R/surv-brier_survival_integrated.R
Original file line number Diff line number Diff line change
Expand Up @@ -51,7 +51,6 @@
#' truth = surv_obj,
#' .pred
#' )
#' @keywords internal
#' @export
brier_survival_integrated <- function(data, ...) {
UseMethod("brier_survival_integrated")
Expand Down
1 change: 0 additions & 1 deletion R/surv-concordance_survival.R
Original file line number Diff line number Diff line change
Expand Up @@ -49,7 +49,6 @@
#' truth = surv_obj,
#' estimate = .pred_time
#' )
#' @keywords internal
#' @export
concordance_survival <- function(data, ...) {
UseMethod("concordance_survival")
Expand Down
1 change: 0 additions & 1 deletion R/surv-roc_auc_survival.R
Original file line number Diff line number Diff line change
Expand Up @@ -55,7 +55,6 @@
#' truth = surv_obj,
#' .pred
#' )
#' @keywords internal
#' @export
roc_auc_survival <- function(data, ...) {
UseMethod("roc_auc_survival")
Expand Down
1 change: 0 additions & 1 deletion R/surv-roc_curve_survival.R
Original file line number Diff line number Diff line change
Expand Up @@ -76,7 +76,6 @@
#'
#' # Or use autoplot
#' autoplot(result)
#' @keywords internal
#' @export
roc_curve_survival <- function(data, ...) {
UseMethod("roc_curve_survival")
Expand Down
14 changes: 14 additions & 0 deletions _pkgdown.yml
Original file line number Diff line number Diff line change
Expand Up @@ -75,6 +75,20 @@ reference:
- equalized_odds
- equal_opportunity

- title: Dynamic Survival Metrics
contents:
- brier_survival
- brier_survival_integrated
- roc_auc_survival

- title: Static Survival Metrics
contents:
- concordance_survival

- title: Curve Survival Functions
contents:
- roc_curve_survival

- title: Curve Functions
contents:
- roc_curve
Expand Down
1 change: 0 additions & 1 deletion man/brier_survival.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/brier_survival_integrated.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/concordance_survival.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/roc_auc_survival.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/roc_curve_survival.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 6104423

Please sign in to comment.