diff --git a/R/tar_built.R b/R/tar_built.R index c43c7e424..837d413b2 100644 --- a/R/tar_built.R +++ b/R/tar_built.R @@ -7,7 +7,7 @@ #' @param names Optional, names of the targets. If supplied, the #' function restricts its output to these targets. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' @examples #' if (identical(Sys.getenv("TAR_EXAMPLES"), "true")) { #' tar_dir({ # tar_dir() runs code from a temporary directory. @@ -19,7 +19,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_built() -#' tar_built(starts_with("y_")) # see also all_of() +#' tar_built(starts_with("y_")) # see also any_of() #' }) #' } tar_built <- function( diff --git a/R/tar_canceled.R b/R/tar_canceled.R index 09ea4c4e2..69d4fbbc0 100644 --- a/R/tar_canceled.R +++ b/R/tar_canceled.R @@ -7,7 +7,7 @@ #' @param names Optional, names of the targets. If supplied, the #' function restricts its output to these targets. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' @examples #' if (identical(Sys.getenv("TAR_EXAMPLES"), "true")) { #' tar_dir({ # tar_dir() runs code from a temporary directory. @@ -19,7 +19,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_canceled() -#' tar_canceled(starts_with("y_")) # see also all_of() +#' tar_canceled(starts_with("y_")) # see also any_of() #' }) #' } tar_canceled <- function( diff --git a/R/tar_delete.R b/R/tar_delete.R index 860680c5b..f6805e9c5 100644 --- a/R/tar_delete.R +++ b/R/tar_delete.R @@ -20,7 +20,7 @@ #' @inheritParams tar_validate #' @param names Names of the targets to remove from `_targets/objects/`. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' @param cloud Logical of length 1, whether to delete objects #' from the cloud if applicable (e.g. AWS, GCP). If `FALSE`, #' files are not deleted from the cloud. diff --git a/R/tar_errored.R b/R/tar_errored.R index 28541750c..b86bdd0cf 100644 --- a/R/tar_errored.R +++ b/R/tar_errored.R @@ -7,7 +7,7 @@ #' @param names Optional, names of the targets. If supplied, the #' function restricts its output to these targets. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' @examples #' if (identical(Sys.getenv("TAR_EXAMPLES"), "true")) { #' tar_dir({ # tar_dir() runs code from a temporary directory. @@ -19,7 +19,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_errored() -#' tar_errored(starts_with("y_")) # see also all_of() +#' tar_errored(starts_with("y_")) # see also any_of() #' }) #' } tar_errored <- function( diff --git a/R/tar_glimpse.R b/R/tar_glimpse.R index ebc9eb03d..cb20e4801 100644 --- a/R/tar_glimpse.R +++ b/R/tar_glimpse.R @@ -40,7 +40,7 @@ #' ) #' }, ask = FALSE) #' tar_glimpse() -#' tar_glimpse(allow = starts_with("y")) # see also all_of() +#' tar_glimpse(allow = starts_with("y")) # see also any_of() #' }) #' } tar_glimpse <- function( diff --git a/R/tar_invalidate.R b/R/tar_invalidate.R index b90b8ffc8..fa8279210 100644 --- a/R/tar_invalidate.R +++ b/R/tar_invalidate.R @@ -18,7 +18,7 @@ #' @inheritParams tar_validate #' @param names Names of the targets to remove from the metadata list. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' @examples #' if (identical(Sys.getenv("TAR_EXAMPLES"), "true")) { #' tar_dir({ # tar_dir() runs code from a temporary directory. diff --git a/R/tar_load.R b/R/tar_load.R index 85e5eaac3..1cd240ee7 100644 --- a/R/tar_load.R +++ b/R/tar_load.R @@ -11,7 +11,7 @@ #' @inheritSection tar_read Limited scope #' @inheritParams tar_load_raw #' @param names Names of the targets to load. -#' You may supply `tidyselect` helpers like [all_of()] and [starts_with()]. +#' You may supply `tidyselect` helpers like [any_of()] and [starts_with()]. #' Names are selected from the metadata in `_targets/meta`, #' which may include errored targets. #' @examples @@ -28,7 +28,7 @@ #' ls() # Does not have "y1", "y2", or "z". #' tar_load(starts_with("y")) #' ls() # Has "y1" and "y2" but not "z". -#' tar_load(all_of("z")) +#' tar_load(any_of("z")) #' ls() # Has "y1", "y2", and "z". #' }) #' } diff --git a/R/tar_load_raw.R b/R/tar_load_raw.R index 39188cdcb..0b3f83398 100644 --- a/R/tar_load_raw.R +++ b/R/tar_load_raw.R @@ -35,7 +35,7 @@ #' ) #' }, ask = FALSE) #' tar_make() -#' tar_load_raw(all_of(c("y1", "y2"))) +#' tar_load_raw(any_of(c("y1", "y2"))) #' y1 #' y2 #' }) diff --git a/R/tar_make.R b/R/tar_make.R index 505724edd..3a9ea8506 100644 --- a/R/tar_make.R +++ b/R/tar_make.R @@ -14,11 +14,11 @@ #' @inheritParams tar_validate #' @param names Names of the targets to build or check. Set to `NULL` to #' check/build all the targets (default). Otherwise, you can supply -#' `tidyselect` helpers like [all_of()] and [starts_with()]. +#' `tidyselect` helpers like [any_of()] and [starts_with()]. #' Because [tar_make()] and friends run the pipeline in a new R session, #' if you pass a character vector to a tidyselect helper, you will need #' to evaluate that character vector early with `!!`, e.g. -#' `tar_make(names = all_of(!!your_vector))`. +#' `tar_make(names = any_of(!!your_vector))`. #' Applies to ordinary targets (stem) and whole dynamic branching targets #' (patterns) but not to individual dynamic branches. #' @param shortcut Logical of length 1, how to interpret the `names` argument. diff --git a/R/tar_manifest.R b/R/tar_manifest.R index f5f70e568..b8c403fc2 100644 --- a/R/tar_manifest.R +++ b/R/tar_manifest.R @@ -10,7 +10,7 @@ #' @param names Names of the targets to show. Set to `NULL` to #' show all the targets (default). Otherwise, you can supply #' symbols, a character vector, or `tidyselect` helpers like -#' [all_of()] and [starts_with()]. +#' [any_of()] and [starts_with()]. #' @param fields Names of the fields, or columns, to show. Set to `NULL` to #' show all the fields (default). Otherwise, you can supply #' `tidyselect` helpers like [starts_with()]. @@ -69,7 +69,7 @@ #' } tar_manifest <- function( names = NULL, - fields = tidyselect::all_of(c("name", "command", "pattern")), + fields = tidyselect::any_of(c("name", "command", "pattern")), drop_missing = TRUE, callr_function = callr::r, callr_arguments = targets::tar_callr_args_default(callr_function), diff --git a/R/tar_meta.R b/R/tar_meta.R index d2982cfa8..ce3a52901 100644 --- a/R/tar_meta.R +++ b/R/tar_meta.R @@ -11,13 +11,13 @@ #' @param names Optional, names of the targets. If supplied, `tar_meta()` #' only returns metadata on these targets. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' If `NULL`, all names are selected. #' @param fields Optional, names of columns/fields to select. If supplied, #' `tar_meta()` only returns the selected metadata columns. #' If `NULL`, all fields are selected. #' You can supply symbols or `tidyselect` helpers -#' like [all_of()] and [starts_with()]. +#' like [any_of()] and [starts_with()]. #' The `name` column is always included first #' no matter what you select. Choices: #' * `name`: name of the target or global object. @@ -77,7 +77,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_meta() -#' tar_meta(starts_with("y_")) # see also all_of() +#' tar_meta(starts_with("y_")) # see also any_of() #' }) #' } tar_meta <- function( diff --git a/R/tar_network.R b/R/tar_network.R index eba8ebbf6..63f1d713c 100644 --- a/R/tar_network.R +++ b/R/tar_network.R @@ -37,7 +37,7 @@ #' resolved, so it will not speed up execution. #' Set to `NULL` to exclude no vertices. #' Otherwise, you can supply symbols or `tidyselect` -#' helpers like [all_of()] and [starts_with()]. +#' helpers like [any_of()] and [starts_with()]. #' @param outdated Logical, whether to show colors to distinguish outdated #' targets from up-to-date targets. (Global functions and objects #' still show these colors.) Looking for outdated targets diff --git a/R/tar_newer.R b/R/tar_newer.R index 8a59c8643..fe16aa356 100644 --- a/R/tar_newer.R +++ b/R/tar_newer.R @@ -16,7 +16,7 @@ #' @param names Names of eligible targets. Targets excluded from `names` #' will not be returned even if they are newer than the given `time`. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' If `NULL`, all names are eligible. #' @param time A `POSIXct` object of length 1, time threshold. #' Targets newer than this time stamp are returned. @@ -38,7 +38,7 @@ #' # Invalidate all targets targets newer than 1 week ago #' # so they run on the next tar_make(). #' invalidate_these <- tar_newer(Sys.time() - as.difftime(1, units = "weeks")) -#' tar_invalidate(all_of(invalidate_these)) +#' tar_invalidate(any_of(invalidate_these)) #' tar_make() #' }) #' } diff --git a/R/tar_objects.R b/R/tar_objects.R index 9cab33022..29a1a2167 100644 --- a/R/tar_objects.R +++ b/R/tar_objects.R @@ -7,7 +7,7 @@ #' @return Character vector of targets saved to `_targets/objects/`. #' @inheritParams tar_validate #' @param names Optional `tidyselect` selector such as -#' [all_of()] or [starts_with()] to return +#' [any_of()] or [starts_with()] to return #' a tactical subset of target names. #' If `NULL`, all names are selected. #' @param cloud Logical of length 1, whether to include @@ -21,7 +21,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_objects() -#' tar_objects(starts_with("x")) # see also all_of() +#' tar_objects(starts_with("x")) # see also any_of() #' }) #' } tar_objects <- function( diff --git a/R/tar_older.R b/R/tar_older.R index 6d3d91782..b1020691f 100644 --- a/R/tar_older.R +++ b/R/tar_older.R @@ -18,7 +18,7 @@ #' @param names Names of eligible targets. Targets excluded from `names` #' will not be returned even if they are old. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' If `NULL`, all names are eligible. #' @param time A `POSIXct` object of length 1, time threshold. #' Targets older than this time stamp are returned. @@ -42,7 +42,7 @@ #' # Invalidate all targets targets older than 1 week from now #' # so they run on the next tar_make(). #' invalidate_these <- tar_older(Sys.time() + as.difftime(1, units = "weeks")) -#' tar_invalidate(all_of(invalidate_these)) +#' tar_invalidate(any_of(invalidate_these)) #' tar_make() #' }) #' } diff --git a/R/tar_outdated.R b/R/tar_outdated.R index 6f9603ae6..b73db05a3 100644 --- a/R/tar_outdated.R +++ b/R/tar_outdated.R @@ -13,7 +13,7 @@ #' these targets and all upstream ancestors in the dependency graph. #' Set `names` to `NULL` to check/build all the targets (default). #' Otherwise, you can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' Applies to ordinary targets (stem) and whole dynamic branching targets #' (patterns) but not to individual dynamic branches. #' @param shortcut Logical of length 1, how to interpret the `names` argument. diff --git a/R/tar_process.R b/R/tar_process.R index fb1f9eaa0..c86ac5756 100644 --- a/R/tar_process.R +++ b/R/tar_process.R @@ -19,7 +19,7 @@ #' If supplied, `tar_process()` #' returns only the rows of the names you select. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' If `NULL`, all names are selected. #' @examples #' if (identical(Sys.getenv("TAR_EXAMPLES"), "true")) { diff --git a/R/tar_progress.R b/R/tar_progress.R index 5b529f8a5..1369ae209 100644 --- a/R/tar_progress.R +++ b/R/tar_progress.R @@ -19,7 +19,7 @@ #' @param names Optional, names of the targets. If supplied, `tar_progress()` #' only returns progress information on these targets. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' @param fields Optional, names of progress data columns to read. #' Set to `NULL` to read all fields. #' @examples @@ -33,7 +33,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_progress() -#' tar_progress(starts_with("y_")) # see also all_of() +#' tar_progress(starts_with("y_")) # see also any_of() #' }) #' } tar_progress <- function( diff --git a/R/tar_sitrep.R b/R/tar_sitrep.R index b37afa680..d5ffa5fe5 100644 --- a/R/tar_sitrep.R +++ b/R/tar_sitrep.R @@ -35,7 +35,7 @@ #' @param fields Optional, names of columns/fields to select. If supplied, #' `tar_sitrep()` only returns the selected metadata columns. #' You can supply symbols or `tidyselect` helpers -#' like [all_of()] and [starts_with()]. +#' like [any_of()] and [starts_with()]. #' The `name` column is always included first #' no matter what you select. Choices: #' * `name`: name of the target or global object. @@ -87,7 +87,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_sitrep() -#' tar_meta(starts_with("y_")) # see also all_of() +#' tar_meta(starts_with("y_")) # see also any_of() #' }) #' } tar_sitrep <- function( diff --git a/R/tar_skipped.R b/R/tar_skipped.R index 4c33ff4f9..0b9d495e5 100644 --- a/R/tar_skipped.R +++ b/R/tar_skipped.R @@ -7,7 +7,7 @@ #' @param names Optional, names of the targets. If supplied, the #' function restricts its output to these targets. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' @examples #' if (identical(Sys.getenv("TAR_EXAMPLES"), "true")) { #' tar_dir({ # tar_dir() runs code from a temporary directory. @@ -19,7 +19,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_skipped() -#' tar_skipped(starts_with("y_")) # see also all_of() +#' tar_skipped(starts_with("y_")) # see also any_of() #' }) #' } tar_skipped <- function( diff --git a/R/tar_started.R b/R/tar_started.R index 1fce468db..517e14dd2 100644 --- a/R/tar_started.R +++ b/R/tar_started.R @@ -7,7 +7,7 @@ #' @param names Optional, names of the targets. If supplied, the #' function restricts its output to these targets. #' You can supply symbols -#' or `tidyselect` helpers like [all_of()] and [starts_with()]. +#' or `tidyselect` helpers like [any_of()] and [starts_with()]. #' @examples #' if (identical(Sys.getenv("TAR_EXAMPLES"), "true")) { #' tar_dir({ # tar_dir() runs code from a temporary directory. @@ -19,7 +19,7 @@ #' }, ask = FALSE) #' tar_make() #' tar_started() -#' tar_started(starts_with("y_")) # see also all_of() +#' tar_started(starts_with("y_")) # see also any_of() #' }) #' } tar_started <- function( diff --git a/R/tar_visnetwork.R b/R/tar_visnetwork.R index cdbdde34b..8069bba07 100644 --- a/R/tar_visnetwork.R +++ b/R/tar_visnetwork.R @@ -24,7 +24,7 @@ #' ) #' }) #' tar_visnetwork() -#' tar_visnetwork(allow = starts_with("y")) # see also all_of() +#' tar_visnetwork(allow = starts_with("y")) # see also any_of() #' }) #' } tar_visnetwork <- function( diff --git a/R/tar_watch_server.R b/R/tar_watch_server.R index 2984b93c0..f564aa1ea 100644 --- a/R/tar_watch_server.R +++ b/R/tar_watch_server.R @@ -115,7 +115,7 @@ tar_watch_server <- function( out <- tar_progress(fields = everything(), store = path_store) if (tar_exist_meta(store = path_store)) { fields <- c("name", "time", "seconds", "bytes", "error", "warnings") - meta <- tar_meta(fields = all_of(fields), store = path_store) + meta <- tar_meta(fields = any_of(fields), store = path_store) meta$finished <- as.character(meta$time) meta$time <- units_seconds(meta$seconds) meta$size <- units_bytes(meta$bytes) diff --git a/man/tar_built.Rd b/man/tar_built.Rd index d7501fa8f..9065b4926 100644 --- a/man/tar_built.Rd +++ b/man/tar_built.Rd @@ -10,7 +10,7 @@ tar_built(names = NULL, store = targets::tar_config_get("store")) \item{names}{Optional, names of the targets. If supplied, the function restricts its output to these targets. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{store}{Character of length 1, path to the \code{targets} data store. Defaults to \code{tar_config_get("store")}, @@ -38,7 +38,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_built() -tar_built(starts_with("y_")) # see also all_of() +tar_built(starts_with("y_")) # see also any_of() }) } } diff --git a/man/tar_canceled.Rd b/man/tar_canceled.Rd index 6f030fd58..42781979e 100644 --- a/man/tar_canceled.Rd +++ b/man/tar_canceled.Rd @@ -10,7 +10,7 @@ tar_canceled(names = NULL, store = targets::tar_config_get("store")) \item{names}{Optional, names of the targets. If supplied, the function restricts its output to these targets. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{store}{Character of length 1, path to the \code{targets} data store. Defaults to \code{tar_config_get("store")}, @@ -38,7 +38,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_canceled() -tar_canceled(starts_with("y_")) # see also all_of() +tar_canceled(starts_with("y_")) # see also any_of() }) } } diff --git a/man/tar_delete.Rd b/man/tar_delete.Rd index 3a5680a42..bfd3ceffc 100644 --- a/man/tar_delete.Rd +++ b/man/tar_delete.Rd @@ -9,7 +9,7 @@ tar_delete(names, cloud = TRUE, store = targets::tar_config_get("store")) \arguments{ \item{names}{Names of the targets to remove from \verb{_targets/objects/}. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{cloud}{Logical of length 1, whether to delete objects from the cloud if applicable (e.g. AWS, GCP). If \code{FALSE}, diff --git a/man/tar_errored.Rd b/man/tar_errored.Rd index e2d9186c5..455a0e201 100644 --- a/man/tar_errored.Rd +++ b/man/tar_errored.Rd @@ -10,7 +10,7 @@ tar_errored(names = NULL, store = targets::tar_config_get("store")) \item{names}{Optional, names of the targets. If supplied, the function restricts its output to these targets. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{store}{Character of length 1, path to the \code{targets} data store. Defaults to \code{tar_config_get("store")}, @@ -38,7 +38,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_errored() -tar_errored(starts_with("y_")) # see also all_of() +tar_errored(starts_with("y_")) # see also any_of() }) } } diff --git a/man/tar_glimpse.Rd b/man/tar_glimpse.Rd index 13ce3be63..6f6141092 100644 --- a/man/tar_glimpse.Rd +++ b/man/tar_glimpse.Rd @@ -59,7 +59,7 @@ Unlike \code{names}, \code{exclude} is invoked only after the graph is mostly resolved, so it will not speed up execution. Set to \code{NULL} to exclude no vertices. Otherwise, you can supply symbols or \code{tidyselect} -helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{level_separation}{Numeric of length 1, \code{levelSeparation} argument of \code{visNetwork::visHierarchicalLayout()}. @@ -152,7 +152,7 @@ tar_script({ ) }, ask = FALSE) tar_glimpse() -tar_glimpse(allow = starts_with("y")) # see also all_of() +tar_glimpse(allow = starts_with("y")) # see also any_of() }) } } diff --git a/man/tar_invalidate.Rd b/man/tar_invalidate.Rd index d4077d8e6..ff3ef0333 100644 --- a/man/tar_invalidate.Rd +++ b/man/tar_invalidate.Rd @@ -9,7 +9,7 @@ tar_invalidate(names, store = targets::tar_config_get("store")) \arguments{ \item{names}{Names of the targets to remove from the metadata list. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{store}{Character of length 1, path to the \code{targets} data store. Defaults to \code{tar_config_get("store")}, diff --git a/man/tar_load.Rd b/man/tar_load.Rd index c081c1dbf..909fd00cf 100644 --- a/man/tar_load.Rd +++ b/man/tar_load.Rd @@ -16,7 +16,7 @@ tar_load( } \arguments{ \item{names}{Names of the targets to load. -You may supply \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +You may supply \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. Names are selected from the metadata in \verb{_targets/meta}, which may include errored targets.} @@ -89,7 +89,7 @@ tar_make() ls() # Does not have "y1", "y2", or "z". tar_load(starts_with("y")) ls() # Has "y1" and "y2" but not "z". -tar_load(all_of("z")) +tar_load(any_of("z")) ls() # Has "y1", "y2", and "z". }) } diff --git a/man/tar_load_raw.Rd b/man/tar_load_raw.Rd index de8ffd6d5..ac591513e 100644 --- a/man/tar_load_raw.Rd +++ b/man/tar_load_raw.Rd @@ -82,7 +82,7 @@ tar_script({ ) }, ask = FALSE) tar_make() -tar_load_raw(all_of(c("y1", "y2"))) +tar_load_raw(any_of(c("y1", "y2"))) y1 y2 }) diff --git a/man/tar_make.Rd b/man/tar_make.Rd index 19139620e..aadc6a96b 100644 --- a/man/tar_make.Rd +++ b/man/tar_make.Rd @@ -18,11 +18,11 @@ tar_make( \arguments{ \item{names}{Names of the targets to build or check. Set to \code{NULL} to check/build all the targets (default). Otherwise, you can supply -\code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +\code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. Because \code{\link[=tar_make]{tar_make()}} and friends run the pipeline in a new R session, if you pass a character vector to a tidyselect helper, you will need to evaluate that character vector early with \verb{!!}, e.g. -\code{tar_make(names = all_of(!!your_vector))}. +\code{tar_make(names = any_of(!!your_vector))}. Applies to ordinary targets (stem) and whole dynamic branching targets (patterns) but not to individual dynamic branches.} diff --git a/man/tar_make_clustermq.Rd b/man/tar_make_clustermq.Rd index f59dafdf5..e34974529 100644 --- a/man/tar_make_clustermq.Rd +++ b/man/tar_make_clustermq.Rd @@ -21,11 +21,11 @@ tar_make_clustermq( \arguments{ \item{names}{Names of the targets to build or check. Set to \code{NULL} to check/build all the targets (default). Otherwise, you can supply -\code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +\code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. Because \code{\link[=tar_make]{tar_make()}} and friends run the pipeline in a new R session, if you pass a character vector to a tidyselect helper, you will need to evaluate that character vector early with \verb{!!}, e.g. -\code{tar_make(names = all_of(!!your_vector))}. +\code{tar_make(names = any_of(!!your_vector))}. Applies to ordinary targets (stem) and whole dynamic branching targets (patterns) but not to individual dynamic branches.} diff --git a/man/tar_make_future.Rd b/man/tar_make_future.Rd index 7d14b8126..c90a70832 100644 --- a/man/tar_make_future.Rd +++ b/man/tar_make_future.Rd @@ -20,11 +20,11 @@ tar_make_future( \arguments{ \item{names}{Names of the targets to build or check. Set to \code{NULL} to check/build all the targets (default). Otherwise, you can supply -\code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +\code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. Because \code{\link[=tar_make]{tar_make()}} and friends run the pipeline in a new R session, if you pass a character vector to a tidyselect helper, you will need to evaluate that character vector early with \verb{!!}, e.g. -\code{tar_make(names = all_of(!!your_vector))}. +\code{tar_make(names = any_of(!!your_vector))}. Applies to ordinary targets (stem) and whole dynamic branching targets (patterns) but not to individual dynamic branches.} diff --git a/man/tar_manifest.Rd b/man/tar_manifest.Rd index d2ddb22bf..dca04aca5 100644 --- a/man/tar_manifest.Rd +++ b/man/tar_manifest.Rd @@ -6,7 +6,7 @@ \usage{ tar_manifest( names = NULL, - fields = tidyselect::all_of(c("name", "command", "pattern")), + fields = tidyselect::any_of(c("name", "command", "pattern")), drop_missing = TRUE, callr_function = callr::r, callr_arguments = targets::tar_callr_args_default(callr_function), @@ -18,7 +18,7 @@ tar_manifest( \item{names}{Names of the targets to show. Set to \code{NULL} to show all the targets (default). Otherwise, you can supply symbols, a character vector, or \code{tidyselect} helpers like -\code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +\code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{fields}{Names of the fields, or columns, to show. Set to \code{NULL} to show all the fields (default). Otherwise, you can supply diff --git a/man/tar_mermaid.Rd b/man/tar_mermaid.Rd index 3d5d73223..74a6b60b2 100644 --- a/man/tar_mermaid.Rd +++ b/man/tar_mermaid.Rd @@ -60,7 +60,7 @@ Unlike \code{names}, \code{exclude} is invoked only after the graph is mostly resolved, so it will not speed up execution. Set to \code{NULL} to exclude no vertices. Otherwise, you can supply symbols or \code{tidyselect} -helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{outdated}{Logical, whether to show colors to distinguish outdated targets from up-to-date targets. (Global functions and objects diff --git a/man/tar_meta.Rd b/man/tar_meta.Rd index 9496bce65..bd35636e3 100644 --- a/man/tar_meta.Rd +++ b/man/tar_meta.Rd @@ -16,14 +16,14 @@ tar_meta( \item{names}{Optional, names of the targets. If supplied, \code{tar_meta()} only returns metadata on these targets. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. If \code{NULL}, all names are selected.} \item{fields}{Optional, names of columns/fields to select. If supplied, \code{tar_meta()} only returns the selected metadata columns. If \code{NULL}, all fields are selected. You can supply symbols or \code{tidyselect} helpers -like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. The \code{name} column is always included first no matter what you select. Choices: \itemize{ @@ -109,7 +109,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_meta() -tar_meta(starts_with("y_")) # see also all_of() +tar_meta(starts_with("y_")) # see also any_of() }) } } diff --git a/man/tar_network.Rd b/man/tar_network.Rd index 5f978df68..2cedead08 100644 --- a/man/tar_network.Rd +++ b/man/tar_network.Rd @@ -57,7 +57,7 @@ Unlike \code{names}, \code{exclude} is invoked only after the graph is mostly resolved, so it will not speed up execution. Set to \code{NULL} to exclude no vertices. Otherwise, you can supply symbols or \code{tidyselect} -helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{outdated}{Logical, whether to show colors to distinguish outdated targets from up-to-date targets. (Global functions and objects diff --git a/man/tar_newer.Rd b/man/tar_newer.Rd index be76a1652..a5683028b 100644 --- a/man/tar_newer.Rd +++ b/man/tar_newer.Rd @@ -20,7 +20,7 @@ then \code{tar_newer()} returns targets newer than one week ago.} \item{names}{Names of eligible targets. Targets excluded from \code{names} will not be returned even if they are newer than the given \code{time}. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. If \code{NULL}, all names are eligible.} \item{inclusive}{Logical of length 1, whether to include targets @@ -68,7 +68,7 @@ tar_make() # Invalidate all targets targets newer than 1 week ago # so they run on the next tar_make(). invalidate_these <- tar_newer(Sys.time() - as.difftime(1, units = "weeks")) -tar_invalidate(all_of(invalidate_these)) +tar_invalidate(any_of(invalidate_these)) tar_make() }) } diff --git a/man/tar_objects.Rd b/man/tar_objects.Rd index b69554b2a..f0ceea6eb 100644 --- a/man/tar_objects.Rd +++ b/man/tar_objects.Rd @@ -12,7 +12,7 @@ tar_objects( } \arguments{ \item{names}{Optional \code{tidyselect} selector such as -\code{\link[=all_of]{all_of()}} or \code{\link[=starts_with]{starts_with()}} to return +\code{\link[=any_of]{any_of()}} or \code{\link[=starts_with]{starts_with()}} to return a tactical subset of target names. If \code{NULL}, all names are selected.} @@ -45,7 +45,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_objects() -tar_objects(starts_with("x")) # see also all_of() +tar_objects(starts_with("x")) # see also any_of() }) } } diff --git a/man/tar_older.Rd b/man/tar_older.Rd index aa6ef622c..ecd256a71 100644 --- a/man/tar_older.Rd +++ b/man/tar_older.Rd @@ -20,7 +20,7 @@ then \code{tar_older()} returns targets older than one week ago.} \item{names}{Names of eligible targets. Targets excluded from \code{names} will not be returned even if they are old. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. If \code{NULL}, all names are eligible.} \item{inclusive}{Logical of length 1, whether to include targets @@ -70,7 +70,7 @@ tar_make() # Invalidate all targets targets older than 1 week from now # so they run on the next tar_make(). invalidate_these <- tar_older(Sys.time() + as.difftime(1, units = "weeks")) -tar_invalidate(all_of(invalidate_these)) +tar_invalidate(any_of(invalidate_these)) tar_make() }) } diff --git a/man/tar_outdated.Rd b/man/tar_outdated.Rd index bde16ad44..e2782c773 100644 --- a/man/tar_outdated.Rd +++ b/man/tar_outdated.Rd @@ -22,7 +22,7 @@ tar_outdated( these targets and all upstream ancestors in the dependency graph. Set \code{names} to \code{NULL} to check/build all the targets (default). Otherwise, you can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. Applies to ordinary targets (stem) and whole dynamic branching targets (patterns) but not to individual dynamic branches.} diff --git a/man/tar_process.Rd b/man/tar_process.Rd index 4bdb16140..af16c4c56 100644 --- a/man/tar_process.Rd +++ b/man/tar_process.Rd @@ -11,7 +11,7 @@ tar_process(names = NULL, store = targets::tar_config_get("store")) If supplied, \code{tar_process()} returns only the rows of the names you select. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. If \code{NULL}, all names are selected.} \item{store}{Character of length 1, path to the diff --git a/man/tar_progress.Rd b/man/tar_progress.Rd index 6b43d20b9..812772ed3 100644 --- a/man/tar_progress.Rd +++ b/man/tar_progress.Rd @@ -14,7 +14,7 @@ tar_progress( \item{names}{Optional, names of the targets. If supplied, \code{tar_progress()} only returns progress information on these targets. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{fields}{Optional, names of progress data columns to read. Set to \code{NULL} to read all fields.} @@ -59,7 +59,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_progress() -tar_progress(starts_with("y_")) # see also all_of() +tar_progress(starts_with("y_")) # see also any_of() }) } } diff --git a/man/tar_sitrep.Rd b/man/tar_sitrep.Rd index 0cbe71905..14eefbb42 100644 --- a/man/tar_sitrep.Rd +++ b/man/tar_sitrep.Rd @@ -25,7 +25,7 @@ or \code{tidyselect} helpers like \code{\link[=starts_with]{starts_with()}}.} \item{fields}{Optional, names of columns/fields to select. If supplied, \code{tar_sitrep()} only returns the selected metadata columns. You can supply symbols or \code{tidyselect} helpers -like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}. +like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}. The \code{name} column is always included first no matter what you select. Choices: \itemize{ @@ -169,7 +169,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_sitrep() -tar_meta(starts_with("y_")) # see also all_of() +tar_meta(starts_with("y_")) # see also any_of() }) } } diff --git a/man/tar_skipped.Rd b/man/tar_skipped.Rd index 7d62fc40f..8fedc031b 100644 --- a/man/tar_skipped.Rd +++ b/man/tar_skipped.Rd @@ -10,7 +10,7 @@ tar_skipped(names = NULL, store = targets::tar_config_get("store")) \item{names}{Optional, names of the targets. If supplied, the function restricts its output to these targets. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{store}{Character of length 1, path to the \code{targets} data store. Defaults to \code{tar_config_get("store")}, @@ -38,7 +38,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_skipped() -tar_skipped(starts_with("y_")) # see also all_of() +tar_skipped(starts_with("y_")) # see also any_of() }) } } diff --git a/man/tar_started.Rd b/man/tar_started.Rd index 659122b5e..99fb3e58c 100644 --- a/man/tar_started.Rd +++ b/man/tar_started.Rd @@ -10,7 +10,7 @@ tar_started(names = NULL, store = targets::tar_config_get("store")) \item{names}{Optional, names of the targets. If supplied, the function restricts its output to these targets. You can supply symbols -or \code{tidyselect} helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +or \code{tidyselect} helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{store}{Character of length 1, path to the \code{targets} data store. Defaults to \code{tar_config_get("store")}, @@ -38,7 +38,7 @@ tar_script({ }, ask = FALSE) tar_make() tar_started() -tar_started(starts_with("y_")) # see also all_of() +tar_started(starts_with("y_")) # see also any_of() }) } } diff --git a/man/tar_visnetwork.Rd b/man/tar_visnetwork.Rd index 03039d833..7414f31ee 100644 --- a/man/tar_visnetwork.Rd +++ b/man/tar_visnetwork.Rd @@ -62,7 +62,7 @@ Unlike \code{names}, \code{exclude} is invoked only after the graph is mostly resolved, so it will not speed up execution. Set to \code{NULL} to exclude no vertices. Otherwise, you can supply symbols or \code{tidyselect} -helpers like \code{\link[=all_of]{all_of()}} and \code{\link[=starts_with]{starts_with()}}.} +helpers like \code{\link[=any_of]{any_of()}} and \code{\link[=starts_with]{starts_with()}}.} \item{outdated}{Logical, whether to show colors to distinguish outdated targets from up-to-date targets. (Global functions and objects @@ -172,7 +172,7 @@ tar_script({ ) }) tar_visnetwork() -tar_visnetwork(allow = starts_with("y")) # see also all_of() +tar_visnetwork(allow = starts_with("y")) # see also any_of() }) } } diff --git a/tests/interactive/test-tar_poll.R b/tests/interactive/test-tar_poll.R index 912366f0a..1a4460980 100644 --- a/tests/interactive/test-tar_poll.R +++ b/tests/interactive/test-tar_poll.R @@ -20,7 +20,7 @@ tar_test("tar_poll() with non-default columns", { ) }) px <- tar_make(callr_function = callr::r_bg, reporter = "silent") - tar_poll(interval = 0.001, fields = all_of(c("built", "time"))) + tar_poll(interval = 0.001, fields = any_of(c("built", "time"))) }) tar_test("tar_poll() timeout", { diff --git a/tests/interactive/test-time.R b/tests/interactive/test-time.R index 6b6e3ad7d..f6be407d6 100644 --- a/tests/interactive/test-time.R +++ b/tests/interactive/test-time.R @@ -39,7 +39,7 @@ tar_test("time of completed branch updates", { ) }) tar_make(callr_function = NULL) - time1 <- tar_meta(all_of(tar_branch_names(y, 1)), time)$time[[1]] + time1 <- tar_meta(any_of(tar_branch_names(y, 1)), time)$time[[1]] Sys.sleep(5) tar_script({ list( @@ -48,7 +48,7 @@ tar_test("time of completed branch updates", { ) }) tar_make(callr_function = NULL) - time2 <- tar_meta(all_of(tar_branch_names(y, 1)), time)$time[[1]] + time2 <- tar_meta(any_of(tar_branch_names(y, 1)), time)$time[[1]] expect_false(identical(time1, time2)) }) @@ -60,7 +60,7 @@ tar_test("time of errored branch stays the same", { ) }) tar_make(callr_function = NULL) - time1 <- tar_meta(all_of(tar_branch_names(y, 1)), time)$time[[1]] + time1 <- tar_meta(any_of(tar_branch_names(y, 1)), time)$time[[1]] expect_false(is.na(time1)) Sys.sleep(5) tar_script({ @@ -70,7 +70,7 @@ tar_test("time of errored branch stays the same", { ) }) expect_error(tar_make(callr_function = NULL), class = "tar_condition_run") - time2 <- tar_meta(all_of(tar_branch_names(y, 1)), time)$time[[1]] + time2 <- tar_meta(any_of(tar_branch_names(y, 1)), time)$time[[1]] expect_equal(time1, time2) }) @@ -82,7 +82,7 @@ tar_test("time of canceled branch stays the same", { ) }) tar_make(callr_function = NULL) - time1 <- tar_meta(all_of(tar_branch_names(y, 1)), time)$time[[1]] + time1 <- tar_meta(any_of(tar_branch_names(y, 1)), time)$time[[1]] expect_false(is.na(time1)) Sys.sleep(5) tar_script({ @@ -92,6 +92,6 @@ tar_test("time of canceled branch stays the same", { ) }) tar_make(callr_function = NULL) - time2 <- tar_meta(all_of(tar_branch_names(y, 1)), time)$time[[1]] + time2 <- tar_meta(any_of(tar_branch_names(y, 1)), time)$time[[1]] expect_equal(time1, time2) }) diff --git a/tests/testthat/test-class_file.R b/tests/testthat/test-class_file.R index 5d7f68748..f2b470f47 100644 --- a/tests/testthat/test-class_file.R +++ b/tests/testthat/test-class_file.R @@ -327,7 +327,7 @@ tar_test("OutDec option temporarily set for file time stamps", { tar_target(data, get_data()) }) tar_make(callr_function = NULL) - out <- tar_meta(data, all_of(c("seconds", "time"))) + out <- tar_meta(data, any_of(c("seconds", "time"))) expect_false(anyNA(out$seconds)) expect_false(anyNA(out$time)) expect_silent(tar_read(data)) diff --git a/tests/testthat/test-tar_manifest.R b/tests/testthat/test-tar_manifest.R index 2c501c3f5..a4e015663 100644 --- a/tests/testthat/test-tar_manifest.R +++ b/tests/testthat/test-tar_manifest.R @@ -25,7 +25,7 @@ tar_test("tar_manifest() drop_missing FALSE", { ) }) out <- tar_manifest( - fields = all_of(c("name", "command", "pattern")), + fields = any_of(c("name", "command", "pattern")), drop_missing = FALSE ) expect_equal(colnames(out), c("name", "command", "pattern")) @@ -42,7 +42,7 @@ tar_test("tar_manifest() drop_missing TRUE", { ) }) out <- tar_manifest( - fields = all_of(c("name", "command", "pattern")), + fields = any_of(c("name", "command", "pattern")), callr_function = NULL, drop_missing = TRUE ) diff --git a/tests/testthat/test-tar_progress_summary.R b/tests/testthat/test-tar_progress_summary.R index e20392f94..b00af3d0d 100644 --- a/tests/testthat/test-tar_progress_summary.R +++ b/tests/testthat/test-tar_progress_summary.R @@ -44,7 +44,7 @@ tar_test("progress with tidyselect fields", { ) ) suppressWarnings(tar_make(callr_function = NULL)) - out <- tar_progress_summary(all_of("time")) + out <- tar_progress_summary(any_of("time")) expect_equal(colnames(out), c("time")) expect_true(is.character(out$time)) })