Skip to content

Commit 88f0932

Browse files
authoredSep 5, 2024
Add a done callback (#542)
So we can ensure that open connections are always closed. Fixes #534.
1 parent fa27e9e commit 88f0932

File tree

6 files changed

+33
-29
lines changed

6 files changed

+33
-29
lines changed
 

‎NEWS.md

+1
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,6 @@
11
# httr2 (development version)
22

3+
* `req_body_file()` no longer leaks a connection if the response doesn't complete succesfully (#534).
34
* `req_perform()` no longer displays a progress bar when sleeping during tests. You can override this behaviour by setting the option `httr2_progress`.
45
* `req_cache()` now re-caches the response if the body is hasn't been modified but the headers have changed (#442).
56
* `req_cache()` works better when `req_perform()` sets a path (#442).

‎R/multi-req.R

+4
Original file line numberDiff line numberDiff line change
@@ -147,6 +147,7 @@ pool_run <- function(pool, perfs, on_error = "continue") {
147147
# Wrap up all components of request -> response in a single object
148148
Performance <- R6Class("Performance", public = list(
149149
req = NULL,
150+
req_prep = NULL,
150151
path = NULL,
151152

152153
handle = NULL,
@@ -166,6 +167,7 @@ Performance <- R6Class("Performance", public = list(
166167
if (is_response(req)) {
167168
self$resp <- req
168169
} else {
170+
self$req_prep <- req_prepare(req)
169171
self$handle <- req_handle(req)
170172
curl::handle_setopt(self$handle, url = req$url)
171173
}
@@ -190,6 +192,7 @@ Performance <- R6Class("Performance", public = list(
190192

191193
succeed = function(res) {
192194
self$progress$update()
195+
req_completed(self$req_prep)
193196

194197
if (is.null(self$path)) {
195198
body <- res$content
@@ -220,6 +223,7 @@ Performance <- R6Class("Performance", public = list(
220223

221224
fail = function(msg) {
222225
self$progress$update()
226+
req_completed(self$req_prep)
223227

224228
self$resp <- error_cnd(
225229
"httr2_failure",

‎R/req-body.R

+6-24
Original file line numberDiff line numberDiff line change
@@ -229,35 +229,17 @@ req_body_apply <- function(req) {
229229

230230
if (type == "raw-file") {
231231
size <- file.info(data)$size
232-
done <- FALSE
233232
# Only open connection if needed
234233
delayedAssign("con", file(data, "rb"))
235234

236-
# Leaks connection if request doesn't complete
237-
readfunction <- function(nbytes, ...) {
238-
if (done) {
239-
return(raw())
240-
}
241-
out <- readBin(con, "raw", nbytes)
242-
if (length(out) < nbytes) {
243-
close(con)
244-
done <<- TRUE
245-
con <<- NULL
246-
}
247-
out
248-
}
249-
seekfunction <- function(offset, ...) {
250-
if (done) {
251-
con <<- file(data, "rb")
252-
done <<- FALSE
253-
}
254-
seek(con, where = offset)
255-
}
256-
235+
req <- req_policies(
236+
req,
237+
done = function() close(con)
238+
)
257239
req <- req_options(req,
258240
post = TRUE,
259-
readfunction = readfunction,
260-
seekfunction = seekfunction,
241+
readfunction = function(nbytes, ...) readBin(con, "raw", nbytes),
242+
seekfunction = function(offset, ...) seek(con, where = offset),
261243
postfieldsize_large = size
262244
)
263245
} else if (type == "raw") {

‎R/req-perform-stream.R

+4-2
Original file line numberDiff line numberDiff line change
@@ -39,7 +39,6 @@ req_perform_stream <- function(req,
3939
round = c("byte", "line")) {
4040
check_request(req)
4141

42-
handle <- req_handle(req)
4342
check_function(callback)
4443
check_number_decimal(timeout_sec, min = 0)
4544
check_number_decimal(buffer_kb, min = 0)
@@ -123,7 +122,8 @@ req_perform_connection <- function(req,
123122
mode <- arg_match(mode)
124123
con_mode <- if (mode == "text") "rf" else "rbf"
125124

126-
handle <- req_handle(req)
125+
req_prep <- req_prepare(req)
126+
handle <- req_handle(req_prep)
127127
the$last_request <- req
128128

129129
tries <- 0
@@ -147,6 +147,8 @@ req_perform_connection <- function(req,
147147
}
148148
}
149149

150+
req_completed(req_prep)
151+
150152
if (error_is_error(req, resp)) {
151153
# Read full body if there's an error
152154
conn <- resp$body

‎R/req-perform.R

+15-3
Original file line numberDiff line numberDiff line change
@@ -94,7 +94,8 @@ req_perform <- function(
9494
return(req)
9595
}
9696

97-
handle <- req_handle(req)
97+
req_prep <- req_prepare(req)
98+
handle <- req_handle(req_prep)
9899
max_tries <- retry_max_tries(req)
99100
deadline <- Sys.time() + retry_max_seconds(req)
100101

@@ -122,14 +123,16 @@ req_perform <- function(
122123
)
123124
}
124125
)
126+
req_completed(req_prep)
125127

126128
if (is_error(resp)) {
127129
tries <- tries + 1
128130
delay <- retry_backoff(req, tries)
129131
} else if (!reauth && resp_is_invalid_oauth_token(req, resp)) {
130132
reauth <- TRUE
131133
req <- auth_oauth_sign(req, TRUE)
132-
handle <- req_handle(req)
134+
req_prep <- req_prepare(req)
135+
handle <- req_handle(req_prep)
133136
delay <- 0
134137
} else if (retry_is_transient(req, resp)) {
135138
tries <- tries + 1
@@ -258,6 +261,7 @@ req_dry_run <- function(req, quiet = FALSE, redact_headers = TRUE) {
258261
req <- req_options(req, debugfunction = debug, verbose = TRUE)
259262
}
260263

264+
req <- req_prepare(req)
261265
handle <- req_handle(req)
262266
curl::handle_setopt(handle, url = req$url)
263267
resp <- curl::curl_echo(handle, progress = FALSE)
@@ -269,14 +273,19 @@ req_dry_run <- function(req, quiet = FALSE, redact_headers = TRUE) {
269273
))
270274
}
271275

272-
req_handle <- function(req) {
276+
# Must call req_prepare(), then req_handle(), then after the request has been
277+
# performed, req_completed()
278+
req_prepare <- function(req) {
273279
req <- req_method_apply(req)
274280
req <- req_body_apply(req)
275281

276282
if (!has_name(req$options, "useragent")) {
277283
req <- req_user_agent(req)
278284
}
279285

286+
req
287+
}
288+
req_handle <- function(req) {
280289
handle <- curl::new_handle()
281290
curl::handle_setheaders(handle, .list = headers_flatten(req$headers))
282291
curl::handle_setopt(handle, .list = req$options)
@@ -286,6 +295,9 @@ req_handle <- function(req) {
286295

287296
handle
288297
}
298+
req_completed <- function(req) {
299+
req_policy_call(req, "done", list(), NULL)
300+
}
289301

290302
new_path <- function(x) structure(x, class = "httr2_path")
291303
is_path <- function(x) inherits(x, "httr2_path")

‎tests/testthat/helper.R

+3
Original file line numberDiff line numberDiff line change
@@ -0,0 +1,3 @@
1+
testthat::set_state_inspector(function() {
2+
getAllConnections()
3+
})

0 commit comments

Comments
 (0)