R/resources_OP.R

Defines functions `%resources%`

#' Temporarily tweaks the resources for the current batchtools strategy
#'
#' @usage fassignment \%resources\% tweaks
#'
#' @param fassignment The future assignment, e.g.
#'        \code{x \%<-\% \{ expr \}}.
#' @param tweaks A named list (or vector) of resource \pkg{batchtools}
#' parameters (see Section 'Resources' in [batchtools::submitJobs()])
#' that should be changed relative to the current strategy.
#'
#' @export
#' @importFrom future plan tweak
#' @keywords internal
`%resources%` <- function(fassignment, tweaks) {
  fassignment <- substitute(fassignment)
  envir <- parent.frame(1)
  stop_if_not(is.vector(tweaks))
  tweaks <- as.list(tweaks)
  stop_if_not(!is.null(names(tweaks)))

  ## Temporarily use a different plan
  oplan <- plan("list")
  on.exit(plan(oplan, substitute = FALSE, .call = NULL))

  ## Tweak current strategy and apply
  args <- list(plan("next"), resources = tweaks, penvir = envir)
  strategy <- do.call(tweak, args = args)
  plan(strategy, substitute = FALSE, .call = NULL)

  eval(fassignment, envir = envir, enclos = baseenv())
}

Try the future.batchtools package in your browser

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

future.batchtools documentation built on May 29, 2024, 3:18 a.m.