Skip to content

Commit

Permalink
Perform validation in creds_key() helper function
Browse files Browse the repository at this point in the history
  • Loading branch information
rich-iannone committed Apr 22, 2020
1 parent 67d6ecb commit 62d40b7
Showing 1 changed file with 2 additions and 0 deletions.
2 changes: 2 additions & 0 deletions R/creds_helpers.R
Original file line number Diff line number Diff line change
Expand Up @@ -134,6 +134,8 @@ creds_envvar <- function(user = NULL,
#' @export
creds_key <- function(id) {

validate_keyring_available(fn_name = "creds_key")

creds_list <- get_smtp_keyring_creds(id = id)

class(creds_list) <- c("creds_key", "blastula_creds")
Expand Down

0 comments on commit 62d40b7

Please sign in to comment.