Skip to content

Commit beee899

Browse files
committed
parameters.R -> arguments.R
1 parent 0ef344c commit beee899

File tree

2 files changed

+13
-226
lines changed

2 files changed

+13
-226
lines changed

R/arguments.R

Lines changed: 13 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
#' @importFrom rlang eval_tidy is_quosure na_lgl lgl is_missing ll
22

33

4-
# `sub_arg_values` takes an existing expression and substitutes
4+
# `sub_arg_values`` takes an existing expression and substitutes
55
# different argument values that are passed to it. `ignore` is
66
# an optional list of arguments that will not have their arguments
77
# substituted.
@@ -33,9 +33,9 @@ sub_arg_values <- function (expr, args, ignore = NULL) {
3333
# to put them into
3434
if (length(missing_args) > 0) {
3535
if (dot_ind == 0) {
36-
stop("Argument(s) ",
36+
stop("Argument(s) not valid for `",
37+
expr[[1]], "`: ",
3738
paste0(missing_args, collapse = ", "),
38-
" are valid for `", expr[[1]], "`",
3939
call. = FALSE)
4040
} else {
4141
expr[[dot_ind]] <- NULL
@@ -206,6 +206,16 @@ parse_engine_options <- function(x) {
206206
#
207207
# This should be done only when the model is to be fit.
208208

209+
#' Resolve a Model Specification for a Computational Engine
210+
#'
211+
#' `finalize` will translate a model specification into a code
212+
#' object that is specific to a particular engine (e.g. R package).
213+
#' It translates generic parameters to their counterparts.
214+
#'
215+
#' @param x A model specification.
216+
#' @param ... Not currently used.
217+
#' @export
218+
#'
209219
finalize <- function (x, ...)
210220
UseMethod("finalize")
211221

R/parameters.R

Lines changed: 0 additions & 223 deletions
This file was deleted.

0 commit comments

Comments
 (0)