Skip to content

Commit 28bea10

Browse files
committed
more upkeep
1 parent 4417798 commit 28bea10

File tree

5 files changed

+6
-4
lines changed

5 files changed

+6
-4
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,7 @@ Authors@R: c(
66
person("Davis", "Vaughan", , "[email protected]", role = "aut"),
77
person("Emil", "Hvitfeldt", , "[email protected]", role = "ctb"),
88
person("Posit Software, PBC", role = c("cph", "fnd"),
9-
comment = c(ROR = "03wc8by49"))
9+
comment = c(ROR = "03wc8by49"))
1010
)
1111
Maintainer: Max Kuhn <[email protected]>
1212
Description: A common interface is provided to allow users to specify a

LICENSE

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,2 +1,2 @@
1-
YEAR: 2021
1+
YEAR: 2025
22
COPYRIGHT HOLDER: parsnip authors

LICENSE.md

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
# MIT License
22

3-
Copyright (c) 2021 parsnip authors
3+
Copyright (c) 2025 parsnip authors
44

55
Permission is hereby granted, free of charge, to any person obtaining a copy
66
of this software and associated documentation files (the "Software"), to deal

R/aaa_multi_predict.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -55,7 +55,7 @@ predict.model_spec <- function(object, ...) {
5555
#' `multi_predict_args()` returns a character vector of argument names (or `NA`
5656
#' if none exist).
5757
#' @keywords internal
58-
#' @examplesIf !parsnip:::is_cran_check()
58+
#' @examplesIf !parsnip:::is_cran_check() & rlang::is_installed("kknn")
5959
#' lm_model_idea <- linear_reg() |> set_engine("lm")
6060
#' has_multi_predict(lm_model_idea)
6161
#' lm_model_fit <- fit(lm_model_idea, mpg ~ ., data = mtcars)

README.md

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -12,6 +12,8 @@ coverage](https://codecov.io/gh/tidymodels/parsnip/branch/main/graph/badge.svg)]
1212
status](https://www.r-pkg.org/badges/version/parsnip)](https://CRAN.R-project.org/package=parsnip)
1313
[![Downloads](https://cranlogs.r-pkg.org/badges/parsnip)](https://CRAN.R-project.org/package=parsnip)
1414
[![lifecycle](https://img.shields.io/badge/lifecycle-stable-brightgreen.svg)](https://lifecycle.r-lib.org/articles/stages.html)
15+
[![Codecov test
16+
coverage](https://codecov.io/gh/tidymodels/parsnip/graph/badge.svg)](https://app.codecov.io/gh/tidymodels/parsnip)
1517
<!-- badges: end -->
1618

1719
## Introduction

0 commit comments

Comments
 (0)