@@ -54,43 +54,39 @@ mode_filter_condition <- function(mode, user_specified_mode) {
54
54
rlang :: quo(mode == !! mode )
55
55
}
56
56
57
- # ' @section Model Specification Checking:
58
- # '
59
- # ' The helpers `spec_is_possible()`, `spec_is_loaded()`, and
60
- # ' `prompt_missing_implementation()` provide tooling for checking
61
- # ' model specifications. In addition to the `spec`, `engine`, and `mode`
62
- # ' arguments, the functions take arguments `user_specified_engine` and
63
- # ' `user_specified_mode`, denoting whether the user themselves has
64
- # ' specified the engine or mode, respectively.
65
- # '
66
- # ' `spec_is_possible()` checks against the union of
67
- # '
68
- # ' * the current parsnip model environment and
69
- # ' * the `model_info_table` of "pre-registered" model specifications
70
- # '
71
- # ' to determine whether a model is well-specified. See
72
- # ' `parsnip:::read_model_info_table()` for this table.
73
- # '
74
- # ' `spec_is_loaded()` checks only against the current parsnip model environment.
75
- # '
76
- # ' `spec_is_possible()` is executed automatically on `new_model_spec()`,
77
- # ' `set_mode()`, and `set_engine()`, and `spec_is_loaded()` is executed
78
- # ' automatically in `print.model_spec()`, among other places. `spec_is_possible()`
79
- # ' should be used when a model specification is still "in progress" of being
80
- # ' specified, while `spec_is_loaded` should only be called when parsnip or an
81
- # ' extension receives some indication that the user is "done" specifying a model
82
- # ' specification: at print, fit, addition to a workflow, or `extract_*()`, for
83
- # ' example.
84
- # '
85
- # ' When `spec_is_loaded()` is `FALSE`, the `prompt_missing_implementation()`
86
- # ' helper will construct an informative message to prompt users to load or
87
- # ' install needed packages. It's `prompt` argument refers to the prompting
88
- # ' function to use, usually [cli::cli_inform] or [cli::cli_abort], and the
89
- # ' ellipses are passed to that function.
90
- # '
91
- # ' @export
92
- # ' @keywords internal
93
- # ' @rdname add_on_exports
57
+ # Model Specification Checking:
58
+ #
59
+ # The helpers `spec_is_possible()`, `spec_is_loaded()`, and
60
+ # `prompt_missing_implementation()` provide tooling for checking
61
+ # model specifications. In addition to the `spec`, `engine`, and `mode`
62
+ # arguments, the functions take arguments `user_specified_engine` and
63
+ # `user_specified_mode`, denoting whether the user themselves has
64
+ # specified the engine or mode, respectively.
65
+ #
66
+ # `spec_is_possible()` checks against the union of
67
+ #
68
+ # * the current parsnip model environment and
69
+ # * the `model_info_table` of "pre-registered" model specifications
70
+ #
71
+ # to determine whether a model is well-specified. See
72
+ # `parsnip:::read_model_info_table()` for this table.
73
+ #
74
+ # `spec_is_loaded()` checks only against the current parsnip model environment.
75
+ #
76
+ # `spec_is_possible()` is executed automatically on `new_model_spec()`,
77
+ # `set_mode()`, and `set_engine()`, and `spec_is_loaded()` is executed
78
+ # automatically in `print.model_spec()`, among other places. `spec_is_possible()`
79
+ # should be used when a model specification is still "in progress" of being
80
+ # specified, while `spec_is_loaded` should only be called when parsnip or an
81
+ # extension receives some indication that the user is "done" specifying a model
82
+ # specification: at print, fit, addition to a workflow, or `extract_*()`, for
83
+ # example.
84
+ #
85
+ # When `spec_is_loaded()` is `FALSE`, the `prompt_missing_implementation()`
86
+ # helper will construct an informative message to prompt users to load or
87
+ # install needed packages. It's `prompt` argument refers to the prompting
88
+ # function to use, usually [cli::cli_inform] or [cli::cli_abort], and the
89
+ # ellipses are passed to that function.
94
90
spec_is_possible <- function (spec ,
95
91
engine = spec $ engine ,
96
92
user_specified_engine = spec $ user_specified_engine ,
@@ -119,10 +115,7 @@ spec_is_possible <- function(spec,
119
115
return (nrow(possibilities ) > 0 )
120
116
}
121
117
122
- # see ?add_on_exports for more information on usage
123
- # ' @export
124
- # ' @keywords internal
125
- # ' @rdname add_on_exports
118
+ # see notes above spec_is_possible for more information on usage
126
119
spec_is_loaded <- function (spec ,
127
120
engine = spec $ engine ,
128
121
user_specified_engine = spec $ user_specified_engine ,
@@ -160,10 +153,7 @@ is_printable_spec <- function(x) {
160
153
# if there's a "pre-registered" extension supporting that setup,
161
154
# nudge the user to install/load it.
162
155
#
163
- # see ?add_on_exports for more information on usage
164
- # ' @export
165
- # ' @keywords internal
166
- # ' @rdname add_on_exports
156
+ # see notes above spec_is_possible for more information on usage
167
157
prompt_missing_implementation <- function (spec ,
168
158
engine = spec $ engine ,
169
159
user_specified_engine = spec $ user_specified_engine ,
0 commit comments