Skip to content

improve model documention #362

@topepo

Description

@topepo

From the NYR workshop, it would be helpful to:

  • document which model/engines use the sub-model trick during tune

  • give a function to list possible engines (see below)

  • note on linear_reg() and others that more engines are available in other packages.

prototype:

show_engines <- function(x) {
  if (!is.character(x) || length(x) > 1) {
    rlang::abort("`show_engines()` takes a single character string as input.")
  }
  res <- try(get_from_env(x), silent = TRUE)
  if (inherits(res, "try-error")) {
    rlang::abort(
      paste0("No results found for model function '", x, "'.")
    )
  }
  res
}

Metadata

Metadata

Assignees

No one assigned

    Type

    No type

    Projects

    No projects

    Milestone

    No milestone

    Relationships

    None yet

    Development

    No branches or pull requests

    Issue actions