Skip to content

Commit a9bb433

Browse files
committed
rephrase prediction type
1 parent 18949a9 commit a9bb433

File tree

2 files changed

+7
-7
lines changed

2 files changed

+7
-7
lines changed

R/validation-rules.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -21,7 +21,7 @@ check_incompatible_types <- function(orderings, call) {
2121
probability_adjustments <- orderings$name[which(orderings$input == "probability")]
2222
cli_abort(
2323
c(
24-
"Can't compose adjustments for different input types.",
24+
"Can't compose adjustments for different prediction types.",
2525
"i" = "{cli::qty(numeric_adjustments)}
2626
Adjustment{?s} {.fn {paste0('adjust_', numeric_adjustments)}}
2727
{cli::qty(numeric_adjustments[-1])} operate{?s} on numerics while

tests/testthat/_snaps/validation-rules.md

Lines changed: 6 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -91,7 +91,7 @@
9191
tailor() %>% adjust_numeric_calibration() %>% adjust_probability_threshold()
9292
Condition
9393
Error in `adjust_probability_threshold()`:
94-
! Can't compose adjustments for different input types.
94+
! Can't compose adjustments for different prediction types.
9595
i Adjustment `adjust_numeric_calibration()` operates on numerics while `adjust_probability_threshold()` operates on probabilities.
9696

9797
---
@@ -102,7 +102,7 @@
102102
lower_limit = 2)
103103
Condition
104104
Error in `adjust_numeric_range()`:
105-
! Can't compose adjustments for different input types.
105+
! Can't compose adjustments for different prediction types.
106106
i Adjustment `adjust_numeric_range()` operates on numerics while `adjust_probability_calibration()` and `adjust_probability_threshold()` operate on probabilities.
107107

108108
---
@@ -112,7 +112,7 @@
112112
adjust_probability_threshold(threshold = 0.4)
113113
Condition
114114
Error in `adjust_probability_threshold()`:
115-
! Can't compose adjustments for different input types.
115+
! Can't compose adjustments for different prediction types.
116116
i Adjustments `adjust_numeric_calibration()` and `adjust_numeric_range()` operate on numerics while `adjust_probability_threshold()` operates on probabilities.
117117

118118
---
@@ -122,7 +122,7 @@
122122
adjust_numeric_calibration() %>% adjust_probability_threshold()
123123
Condition
124124
Error in `adjust_probability_threshold()`:
125-
! Can't compose adjustments for different input types.
125+
! Can't compose adjustments for different prediction types.
126126
i Adjustment `adjust_numeric_calibration()` operates on numerics while `adjust_probability_threshold()` operates on probabilities.
127127

128128
---
@@ -133,7 +133,7 @@
133133
threshold = 0.4) %>% adjust_numeric_range(lower_limit = 2)
134134
Condition
135135
Error in `adjust_numeric_range()`:
136-
! Can't compose adjustments for different input types.
136+
! Can't compose adjustments for different prediction types.
137137
i Adjustment `adjust_numeric_range()` operates on numerics while `adjust_probability_calibration()` and `adjust_probability_threshold()` operate on probabilities.
138138

139139
---
@@ -144,6 +144,6 @@
144144
adjust_probability_threshold(threshold = 0.4)
145145
Condition
146146
Error in `adjust_probability_threshold()`:
147-
! Can't compose adjustments for different input types.
147+
! Can't compose adjustments for different prediction types.
148148
i Adjustments `adjust_numeric_calibration()` and `adjust_numeric_range()` operate on numerics while `adjust_probability_threshold()` operates on probabilities.
149149

0 commit comments

Comments
 (0)