handle_url <- function(handle = NULL, url = NULL, ...) {
if (is.null(url) && is.null(handle)) {
stop("Must specify at least one of url or handle")
}
if (is.null(handle)) handle <- handle_find(url)
if (is.null(url)) url <- handle$url
# If named components in ..., modify the url
new <- named(list(...))
if (length(new) > 0 || is.url(url)) {
old <- parse_url(url)
url <- build_url(utils::modifyList(old, new))
}
list(handle = handle, url = url)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.