Skip to content

Commit

Permalink
add NEWS line and DRY out roxygen, as @hadley suggests in #211
Browse files Browse the repository at this point in the history
  • Loading branch information
cboettig committed May 4, 2015
1 parent d6e4181 commit f2a2e9a
Show file tree
Hide file tree
Showing 2 changed files with 8 additions and 2 deletions.
6 changes: 6 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,5 +1,11 @@
# httr 0.6.1.9000

- `oauth1.0_token` and `oauth2.0_token` now permit the `oauth_listener` to listen on
a custom IP address and port (the previously hardwired ip:port of `127.0.0.1:1410`
is now just the default). This permits authentication to work under other settings,
such as inside docker containers (which require localhost uses `0.0.0.0` instead).
Thanks @cboettig (#211).

# httr 0.6.1

* Correctly parse headers with multiple `:`, thanks to @mmorgan (#180).
Expand Down
4 changes: 2 additions & 2 deletions R/oauth-init.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,8 +7,7 @@
#' \code{\link{oauth_app}}
#' @param permission optional, a string of permissions to ask for.
#' @param is_interactive Is the current environment interactive?
#' @param host ip address for the listener
#' @param port for the listener
#' @inheritParams oauth_listener
#' @export
#' @keywords internal
init_oauth1.0 <- function(endpoint, app, permission = NULL,
Expand Down Expand Up @@ -53,6 +52,7 @@ init_oauth1.0 <- function(endpoint, app, permission = NULL,
#' Otherwise, provide a URL to the user and prompt for a validation
#' code. Defaults to the of the \code{"httr_oob_default"} default,
#' or \code{TRUE} if \code{httpuv} is not installed.
#' @inheritParams oauth_listener
#' @export
#' @keywords internal
init_oauth2.0 <- function(endpoint, app, scope = NULL, type = NULL,
Expand Down

0 comments on commit f2a2e9a

Please sign in to comment.