-
Notifications
You must be signed in to change notification settings - Fork 5
Closed
Labels
bugan unexpected problem or unintended behavioran unexpected problem or unintended behavior
Description
web <- webfakes::local_app_process(
webfakes::httpbin_app(),
opts = webfakes::server_opts(num_threads = 3)
)
library(testthat)
test_that("", {
url <- web$url("/delay/1")
p <- curl::new_pool()
handles <- replicate(3, curl::new_handle(url = url, http_version = 3))
resps <- list()
for (handle in handles) {
curl::multi_add(
handle,
done = function(x) message("one is done"),
fail = stop,
pool = p
)
}
st <- system.time(curl::multi_run(timeout = 5, pool = p))
print(st)
expect_true(st[["elapsed"]] < 3.0)
})
Metadata
Metadata
Assignees
Labels
bugan unexpected problem or unintended behavioran unexpected problem or unintended behavior