Skip to content

The autoplot() method plots cross validation performances of candidate models in H2O AutoML output via facets on each metric.

Usage

# S3 method for workflow
autoplot(object, ...)

# S3 method for H2OAutoML
autoplot(
  object,
  type = c("rank", "metric"),
  metric = NULL,
  std_errs = qnorm(0.95),
  ...
)

Arguments

object

A fitted auto_ml() model.

...

Other options to pass to autoplot().

type

A character value for whether to plot average ranking ("rank") or metrics ("metric").

metric

A character vector or NULL for which metric to plot. By default, all metrics will be shown via facets.

std_errs

The number of standard errors to plot.

Value

A ggplot object.

Examples

if (h2o_running()) {
  auto_fit <- auto_ml() %>%
    set_engine("h2o", max_runtime_secs = 5) %>%
    set_mode("regression") %>%
    fit(mpg ~ ., data = mtcars)

  autoplot(auto_fit)
}