split_tags <- function(tags) {
verify_onestring(tags)
tags <- strsplit(tags, "|", fixed = TRUE)[[1]]
tags <- trimws(tags, which = "both")
tags <- tags[tags != ""]
return(tags)
}
split_url <- function(url) {
verify_onestring(url)
url <- strsplit(url, "|", fixed = TRUE)[[1]]
url <- trimws(url, which = "both")
url <- url[url != ""]
return(url)
}
empty_url <- function() {
new_url(site = character(0), link = character(0), verify = FALSE)
}
idstring <- function() {
paste0(sample(c(letters, LETTERS), 10, TRUE), collapse="")
}
# Specify a print method for a workbench tibble
#' @export
print.wkbch_tbl <- function(x, n = 100, ...) {
class(x) <- setdiff(class(x), "wkbch_tbl")
print(x, n = n, ...)
}
# A very bad way to coerce tibble to workbench tibble
as_wkbch_tbl <- function(x) {
class(x) <- c("wkbch_tbl", class(x))
return(x)
}
#' @importFrom rlang %||%
NULL
# # returns a list of expressions
# capture_dots <- function(...) {
# as.list(substitute(list(...)))[-1L]
# }
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.