R/get_current_price.R

Defines functions get_current_price

Documented in get_current_price

#' Get current price of cryptocurrencies
#'
#' Get current price of cryptocurrencies using the REST API of cryptowat.ch.
#' The route is \emph{price} or \emph{prices} and returns the current price of
#' a given pair or current prices of all pairs. See
#' \url{https://docs.cryptowat.ch/rest-api/markets/price} for further information.
#'
#' @usage get_current_price(pair, exchange = "kraken", api_key = NULL,
#'                          allowance = FALSE)
#' @param pair A string containing a pair symbol, e.g. \emph{btcusd} (required
#' argument). Run \code{get_pairs()} to find other available pairs.
#' @param exchange A string containing the exchange. Default is \emph{kraken}.
#' Run \code{get_exchanges()} to find other available exchanges.
#' @param api_key A string containing the API key. See
#' \url{https://docs.cryptowat.ch/rest-api/rate-limit} to learn how to create
#' an account and how to generate an API key.
#' @param allowance A logical (default is \code{FALSE}). If \code{TRUE} the
#' function returns a list which includes allowance information, i.e. cost of
#' the request, remaining credits and your account name.
#'
#' @return Current price of a given pair of currencies. If allowance is
#' \code{TRUE}, \code{get_current_price()} returns a list.
#'
#' @references See \url{https://docs.cryptowat.ch/rest-api} for further information.
#' @seealso \code{\link{get_markets}}, \code{\link{get_ohlc}},
#' \code{\link{get_exchanges}}, \code{\link{get_pairs}}
#' @examples
#' \dontrun{
#' # Daily prices of Bitcoin in USD
#' current_price <- get_current_price("btcusd")
#' current_prices <- get_current_price()
#' }
#' @export
get_current_price <- function(pair = NULL, exchange = "kraken", api_key = NULL,
                              allowance = FALSE) {

  route <- ifelse(!is.null(pair), "price", "prices")

  prices <- get_markets(route = route, pair = pair, exchange = exchange,
                        api_key = api_key, allowance = allowance)

  if (allowance) {

    allowance_list <- prices[[2]]
    prices <- prices[[1]]

  }


  if (!is.null(pair)) {

    price_out <- ifelse(allowance, prices, prices$price)

  } else if (is.null(pair)) {

    price_out <- data.frame(name = names(prices), price = unlist(prices))
    rownames(price_out) <- 1:nrow(price_out)

  }

  if (allowance) {

    output <- list(result = price_out, allowance = allowance_list)

  } else if (allowance == FALSE) {

    output <- price_out
  }

  return(output)

}
lorenzbr/cryptowatchR documentation built on April 15, 2022, 4:41 a.m.