Skip to content

Commit

Permalink
Fix #1411
Browse files Browse the repository at this point in the history
  • Loading branch information
wlandau committed Jan 8, 2025
1 parent 096c358 commit 416c0f4
Show file tree
Hide file tree
Showing 28 changed files with 45 additions and 38 deletions.
2 changes: 1 addition & 1 deletion R/tar_built.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
#' @export
#' @keywords internal
#' @description Deprecated in favor of [tar_completed()] on 2023-12-04
#' (version 1.3.2.9004).
#' (`targets` version 1.3.2.9004).
#' @return A character vector of completed targets.
#' @inheritParams tar_progress
#' @examples
Expand Down
2 changes: 1 addition & 1 deletion R/tar_config_get.R
Original file line number Diff line number Diff line change
Expand Up @@ -52,7 +52,7 @@ tar_config_is_multi_project <- function(yaml, config) {
out <- !length(yaml) || any(map_lgl(yaml, ~is.list(.x)))
if (!out && any(file.exists(config))) {
msg <- paste(
"As of version 0.7.9001 (September 2021),",
"As of targets version 0.7.9001 (September 2021),",
"targets YAML configuration files",
"are moving to a format that supports multiple projects.",
"Call tar_config_set(config = %s) to migrate",
Expand Down
7 changes: 4 additions & 3 deletions R/tar_config_set.R
Original file line number Diff line number Diff line change
Expand Up @@ -70,7 +70,8 @@
#' run the script from the current working directory.
#' If the argument `NULL`, the setting is not modified.
#' Use [tar_config_unset()] to delete a setting.
#' @param seconds_interval Deprecated on 2023-08-24 (version 1.2.2.9001).
#' @param seconds_interval Deprecated on 2023-08-24
#' (`targets` version 1.2.2.9001).
#' Use `seconds_meta_append`, `seconds_meta_upload`,
#' and `seconds_reporter` instead.
#' @param seconds_meta_append Argument of [tar_make()], [tar_make_clustermq()],
Expand Down Expand Up @@ -193,7 +194,7 @@ tar_config_set <- function(
project = Sys.getenv("TAR_PROJECT", "main")
) {
# TODO: remove single-project format, which was deprecated on
# 2021-09-03 (version 0.7.0.9001).
# 2021-09-03 (targets version 0.7.0.9001).
tar_assert_chr(config)
tar_assert_scalar(config)
tar_assert_chr(project)
Expand Down Expand Up @@ -282,7 +283,7 @@ tar_config_assert_garbage_collection <- function(garbage_collection) {
}
tar_warn_deprecate(
"The garbage_collection argument of tar_config_set() was deprecated ",
"in version 1.8.0.9004 (2024-10-22). The garbage_collection ",
"in targets version 1.8.0.9004 (2024-10-22). The garbage_collection ",
"argument of tar_option_set() is more unified and featureful now. ",
"Please have a look at its documentation."
)
Expand Down
4 changes: 2 additions & 2 deletions R/tar_deduplicate.R
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
#' @title Deduplicate meta and progress databases (deprecated).
#' @export
#' @keywords internal
#' @description Deprecated in version 0.3.0 (2020-03-06).
#' @description Deprecated in `targets` version 0.3.0 (2020-03-06).
#' Deduplication happens automatically before and after the pipeline runs.
#' @details Removes duplicated entries in the meta and progress
#' databases in order to lighten storage. These databases are located
Expand All @@ -22,7 +22,7 @@ tar_deduplicate <- function(
) {
tar_assert_allow_meta("tar_deduplicate", store)
tar_warn_deprecate(
"tar_deduplicate() is deprecated in version 0.3.0 (2020-03-06). ",
"tar_deduplicate() is deprecated in targets version 0.3.0 (2020-03-06). ",
"The tar_make*() functions do enough deduplication now automatically."
)
tar_assert_lgl(meta, "meta arg of tar_deduplicate() must be logical.")
Expand Down
2 changes: 1 addition & 1 deletion R/tar_engine_knitr.R
Original file line number Diff line number Diff line change
Expand Up @@ -94,7 +94,7 @@ tar_engine_knitr <- function(options) {
options$tar_globals <- options$tar_globals %|||% options$targets
tar_warn_deprecate(
"In Target Markdown, the `targets` chunk option is deprecated ",
"(version 0.6.0, 2021-07-21). ",
"(targets version 0.6.0, 2021-07-21). ",
"Set the chunk option tar_globals = TRUE to define functions, ",
"global objects, and settings. To define targets, ",
"either set tar_globals = FALSE or leave tar_globals unset."
Expand Down
5 changes: 3 additions & 2 deletions R/tar_make.R
Original file line number Diff line number Diff line change
Expand Up @@ -46,7 +46,8 @@
#' steps like data retrieval and output storage.
#' * `"verbose_positives"`: same as the `"verbose"` reporter
#' except without messages for skipped targets.
#' @param seconds_interval Deprecated on 2023-08-24 (version 1.2.2.9001).
#' @param seconds_interval Deprecated on 2023-08-24
#' (targets version 1.2.2.9001).
#' Use `seconds_meta_append`, `seconds_meta_upload`,
#' and `seconds_reporter` instead.
#' @param seconds_meta_append Positive numeric of length 1 with the minimum
Expand Down Expand Up @@ -175,7 +176,7 @@ tar_make <- function(
NULL,
tar_warn_deprecate(
"The garbage_collection argument of tar_make() was deprecated ",
"in version 1.8.0.9004 (2024-10-22). The garbage_collection ",
"in targets version 1.8.0.9004 (2024-10-22). The garbage_collection ",
"argument of tar_option_set() is more unified and featureful now. ",
"Please have a look at its documentation."
)
Expand Down
2 changes: 1 addition & 1 deletion R/tar_make_clustermq.R
Original file line number Diff line number Diff line change
Expand Up @@ -96,7 +96,7 @@ tar_make_clustermq <- function(
NULL,
tar_warn_deprecate(
"The garbage_collection argument of tar_make() was deprecated ",
"in version 1.8.0.9004 (2024-10-22). The garbage_collection ",
"in targets version 1.8.0.9004 (2024-10-22). The garbage_collection ",
"argument of tar_option_set() is more unified and featureful now. ",
"Please have a look at its documentation."
)
Expand Down
2 changes: 1 addition & 1 deletion R/tar_make_future.R
Original file line number Diff line number Diff line change
Expand Up @@ -80,7 +80,7 @@ tar_make_future <- function(
NULL,
tar_warn_deprecate(
"The garbage_collection argument of tar_make_future() was deprecated ",
"in version 1.8.0.9004 (2024-10-22). The garbage_collection ",
"in targets version 1.8.0.9004 (2024-10-22). The garbage_collection ",
"argument of tar_option_set() is more unified and featureful now. ",
"Please have a look at its documentation."
)
Expand Down
6 changes: 3 additions & 3 deletions R/tar_resources_crew.R
Original file line number Diff line number Diff line change
Expand Up @@ -20,8 +20,8 @@
#' group to use. If you need heterogeneous workers,
#' you can leverage this argument to send different
#' targets to different worker groups.
#' @param scale Deprecated in version 1.3.0.9002 (2023-10-02). No longer
#' necessary.
#' @param scale Deprecated in `targets` version 1.3.0.9002 (2023-10-02).
#' No longer necessary.
#' @param seconds_timeout Positive numeric of length 1,
#' optional task timeout passed to the `.timeout`
#' argument of `mirai::mirai()` (after converting to milliseconds).
Expand All @@ -42,7 +42,7 @@ tar_resources_crew <- function(
if (!is.null(scale)) {
tar_warn_deprecate(
"The scale argument of tar_resources_crew() is ",
"obsolete and deprecated (version 1.3.0.9002, 2023-10-02)."
"obsolete and deprecated (targets version 1.3.0.9002, 2023-10-02)."
)
}
out <- resources_crew_init(
Expand Down
4 changes: 2 additions & 2 deletions R/tar_seed.R
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
#' @title Deprecated: get the seed of the current target.
#' @export
#' @keywords internal
#' @description Deprecated on 2023-10-12 (version 1.3.2.9001).
#' @description Deprecated on 2023-10-12 (`targets` version 1.3.2.9001).
#' Use [tar_seed_get()] instead.
#' @return Integer of length 1. If invoked inside a `targets` pipeline,
#' the return value is the seed of the target currently running,
Expand All @@ -20,7 +20,7 @@
#' }
tar_seed <- function(default = 1L) {
tar_warn_deprecate(
"tar_seed() was deprecated on 2023-10-12 (version 1.3.2.9001). ",
"tar_seed() was deprecated on 2023-10-12 (targets version 1.3.2.9001). ",
"Use tar_seed_get() instead."
)
tar_seed_get(default = default)
Expand Down
2 changes: 1 addition & 1 deletion R/tar_started.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
#' @export
#' @keywords internal
#' @description Deprecated in favor of [tar_dispatched()] on 2023-12-04
#' (version 1.3.2.9004).
#' (`targets` version 1.3.2.9004).
#' @return A character vector of dispatched targets.
#' @inheritParams tar_progress
#' @examples
Expand Down
2 changes: 1 addition & 1 deletion R/tar_target.R
Original file line number Diff line number Diff line change
Expand Up @@ -245,7 +245,7 @@
#' * `"null"`: The errored target continues and returns `NULL`.
#' The data hash is deliberately wrong so the target is not
#' up to date for the next run of the pipeline. In addition,
#' as of version 1.8.0.9011, a value of `NULL` is given
#' as of `targets` version 1.8.0.9011, a value of `NULL` is given
#' to upstream dependencies with `error = "null"` if loading fails.
#' * `"abridge"`: any currently running targets keep running,
#' but no new targets launch after that.
Expand Down
4 changes: 2 additions & 2 deletions R/use_targets.R
Original file line number Diff line number Diff line change
Expand Up @@ -13,8 +13,8 @@
#' in the RStudio IDE.
#' @param overwrite Logical of length 1, `TRUE` to overwrite the the target
#' script file, `FALSE` otherwise.
#' @param scheduler Deprecated in version 1.5.0.9001 (2024-02-12).
#' @param job_name Deprecated in version 1.5.0.9001 (2024-02-12).
#' @param scheduler Deprecated in `targets` version 1.5.0.9001 (2024-02-12).
#' @param job_name Deprecated in `targets` version 1.5.0.9001 (2024-02-12).
#' @examples
#' if (identical(Sys.getenv("TAR_INTERACTIVE_EXAMPLES"), "true")) {
#' tar_dir({ # tar_dir() runs code from a temp dir for CRAN.
Expand Down
2 changes: 1 addition & 1 deletion R/utils_callr.R
Original file line number Diff line number Diff line change
Expand Up @@ -292,7 +292,7 @@ tar_callr_args_default <- function(callr_function, reporter = NULL) {
#' @title Deprecated: `callr` arguments.
#' @export
#' @keywords internal
#' @description Deprecated on 2022-08-05 (version 0.13.1).
#' @description Deprecated on 2022-08-05 (`targets` version 0.13.1).
#' Please use [tar_callr_args_default()] instead.
#' @details Not a user-side function. Do not invoke directly.
#' Exported for internal purposes only.
Expand Down
2 changes: 1 addition & 1 deletion man/callr_args_default.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tar_built.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/tar_config_set.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tar_deduplicate.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/tar_make.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/tar_make_clustermq.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/tar_make_future.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tar_option_set.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/tar_outdated.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/tar_resources_crew.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tar_seed.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tar_started.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tar_target.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/use_targets.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 416c0f4

Please sign in to comment.