R/rstudio_addin_tar_make_bg.R

Defines functions rstudio_addin_tar_make_bg

Documented in rstudio_addin_tar_make_bg

# RStudio addins are tested interactively in
# tests/interactive/test-rstudio_addins.R. # nolint
# nocov start
#' @title RStudio addin to run [tar_make()] in the background.
#' @description For internal use only. Not a user-side function.
#' @export
#' @keywords internal
rstudio_addin_tar_make_bg <- function() {
  tar_make(callr_function = callr::r_bg)
  cli_blue_bullet(
    "Running tar_make() in background. Monitor with tar_progress()."
  )
}
# nocov end

Try the targets package in your browser

Any scripts or data that you put into this service are public.

targets documentation built on Oct. 12, 2023, 5:07 p.m.