Skip to content

Commit

Permalink
Speed up example
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed Aug 10, 2023
1 parent 3011a1b commit 54c0e9f
Show file tree
Hide file tree
Showing 2 changed files with 8 additions and 0 deletions.
4 changes: 4 additions & 0 deletions R/http-get.r
Original file line number Diff line number Diff line change
Expand Up @@ -46,8 +46,10 @@
#' @export
#' @examples
#' GET("http://google.com/")
#' \dontrun{
#' GET("http://google.com/", path = "search")
#' GET("http://google.com/", path = "search", query = list(q = "ham"))
#' }
#'
#' # See what GET is doing with httpbin.org
#' \dontrun{
Expand All @@ -62,9 +64,11 @@
#'
#' # You might want to manually specify the handle so you can have multiple
#' # independent logins to the same website.
#' \dontrun{
#' google <- handle("http://google.com")
#' GET(handle = google, path = "/")
#' GET(handle = google, path = "search")
#' }
GET <- function(url = NULL, config = list(), ..., handle = NULL) {
hu <- handle_url(handle, url, ...)
req <- request_build("GET", hu$url, as.request(config), ...)
Expand Down
4 changes: 4 additions & 0 deletions man/GET.Rd

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

0 comments on commit 54c0e9f

Please sign in to comment.