Open
Description
When I run a req_perform_parallel
with a progress bar and abort the operation, every new call to req_perform_parallel
will error until the R session is restarted. Here is a minimal example:
library(httr2)
reqs <- list(
request(example_url()) |>
req_url_path("/delay") |>
req_url_path_append(sample(1:10, 1))
) |>
rep(100)
resps <- req_perform_parallel(reqs, progress = TRUE)
### stop with Esc ##
resps <- req_perform_parallel(reqs, progress = TRUE)
#> Error in cli::cli_progress_update(..., id = id) :
#> Cannot find progress bar `cli-25573-7`
#> Error in cli::cli_progress_update(..., id = id) :
#> Cannot find progress bar `cli-25573-7`
This does not apply to req_perform_sequential
.