Skip to content

Commit

Permalink
Merged origin/main into cookie-jar
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed Aug 24, 2023
2 parents ef66cbd + 095fa3b commit e125718
Show file tree
Hide file tree
Showing 2 changed files with 10 additions and 6 deletions.
8 changes: 5 additions & 3 deletions R/resp-url.R
Original file line number Diff line number Diff line change
Expand Up @@ -8,12 +8,14 @@
#' @inheritParams resp_header
#' @export
#' @examples
#' req <- request("https://httr2.r-lib.org?hello=world")
#' resp <- request(example_url()) %>%
#' req_url_path("/get?hello=world") %>%
#' req_perform()
#'
#' resp <- req_perform(req)
#' resp %>% resp_url()
#' resp %>% resp_url_path()
#' resp %>% resp_url_query()
#' resp %>% resp_url_queries()
#' resp %>% resp_url_query("hello")
resp_url <- function(resp) {
check_response(resp)

Expand Down
8 changes: 5 additions & 3 deletions man/resp_url.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit e125718

Please sign in to comment.