Skip to content

Commit

Permalink
Merge branch 'main' into changing-type
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley authored Sep 3, 2024
2 parents afc3255 + 0b795b6 commit f4f3b48
Show file tree
Hide file tree
Showing 3 changed files with 17 additions and 2 deletions.
1 change: 1 addition & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,6 +1,7 @@
# httr2 (development version)

* `req_body_*()` now give informative error if you attempt to change the body type (#451).
* `resp_body_html()` and `resp_body_xml()` now work when `req_perform()` is given a path (#448).
* `req_body_file()` now works with files >64kb once more (#524).
* New `req_perform_connection()` for working with streaming data. Unlike `req_perform_stream()` which uses callbacks, `req_perform_connection()` returns a regular response object with a connection as the body. It's paired with `resp_stream_bytes()`, `resp_stream_lines()`, and `resp_stream_sse()` that allows you to stream chunks as you want them. Unlike `req_perform_stream()` it supports `req_retry()` (with @jcheng5, #519).

Expand Down
6 changes: 4 additions & 2 deletions R/resp-body.R
Original file line number Diff line number Diff line change
Expand Up @@ -125,7 +125,8 @@ resp_body_html <- function(resp, check_type = TRUE, ...) {
check_type = check_type
)

xml2::read_html(resp$body, ...)
body <- resp_body_raw(resp)
xml2::read_html(body, ...)
}

#' @rdname resp_body_raw
Expand All @@ -146,7 +147,8 @@ resp_body_xml <- function(resp, check_type = TRUE, ...) {
check_type = check_type
)

resp$cache[[key]] <- xml2::read_xml(resp$body, ...)
body <- resp_body_raw(resp)
resp$cache[[key]] <- xml2::read_xml(body, ...)
resp$cache[[key]]
}

Expand Down
12 changes: 12 additions & 0 deletions tests/testthat/test-resp-body.R
Original file line number Diff line number Diff line change
Expand Up @@ -30,6 +30,18 @@ test_that("can retrieve parsed body", {
expect_s3_class(resp_body_xml(resp), "xml_document")
})

test_that("can retrieve parsed body when saved to a file", {
path <- withr::local_tempfile()
resp <- request_test("/json") %>% req_perform(path)
expect_type(resp_body_json(resp), "list")

resp <- request_test("/html") %>% req_perform(path)
expect_s3_class(resp_body_html(resp), "xml_document")

resp <- request_test("/xml") %>% req_perform(path)
expect_s3_class(resp_body_xml(resp), "xml_document")
})

test_that("resp_body_json stores parsed result", {
resp <- request_test("/json") %>% req_perform()
json1 <- resp_body_json(resp)
Expand Down

0 comments on commit f4f3b48

Please sign in to comment.