blob: 8e541552354c427aaca8eb7cbbff883da01b29e4 [file] [log] [blame]
brentthorne8ee00762019-04-24 12:57:51 -04001#' Posterdown HTML format (using pagedown::poster_relaxed)
Luke W Johnston79329cc2019-04-24 17:14:04 +02002#'
brentthorne275dbbe2019-02-05 13:31:30 -05003#' @inheritParams pagedown::poster_relaxed
Luke W Johnston79329cc2019-04-24 17:14:04 +02004#' @param ... Additional arguments to `rmarkdown::html_document`
brentthorne275dbbe2019-02-05 13:31:30 -05005#'
6#' @return R Markdown output format to pass to
brentthorne8ee00762019-04-24 12:57:51 -04007#' [rmarkdown::render()]
brentthorne275dbbe2019-02-05 13:31:30 -05008#'
brentthorne164b9a82019-10-09 10:08:13 -04009#'@examples
10#'\donttest{
11#'file <- file.path(tempdir(),"foo.rmd")
12#'rmarkdown::draft(file, template="posterdown_html", package="posterdown")
13#'}
14#'
brentthorne275dbbe2019-02-05 13:31:30 -050015#' @export
16posterdown_html <- function(...,
17 template = find_resource("posterdown_html", "template.html"),
18 css = NULL) {
19 pagedown::poster_relaxed(..., css = css, template = template)
20}
Luke W Johnston79329cc2019-04-24 17:14:04 +020021
Marc Kupietzd2be7362023-06-14 07:17:27 +020022#' Posterdown IDS-CD based on HTML format (using pagedown::poster_relaxed)
23#'
24#' @inheritParams pagedown::poster_relaxed
25#' @param ... Additional arguments to `rmarkdown::html_document`
26#'
27#' @return R Markdown output format to pass to
28#' [rmarkdown::render()]
29#'
30#'@examples
31#'\donttest{
32#'file <- file.path(tempdir(),"foo.rmd")
33#'rmarkdown::draft(file, template="posterdown_ids", package="posterdown")
34#'}
35#'
36#' @description The output format `poster_ids()` mimics the IDS Mannheim
37#' corporate design posters.
38#' @rdname posterdown_html
39#' @export
40posterdown_ids <- function(...,
41 template = find_resource("posterdown_ids", "template.html"),
42 css = NULL) {
43 pagedown::poster_relaxed(..., css = css, template = template)
44}
45
Luke W Johnston79329cc2019-04-24 17:14:04 +020046#' @description The output format `poster_betterland()` mimics the style of the
brentthorne8ee00762019-04-24 12:57:51 -040047#' BetterPoster movement from twitter.
brentthorne75828bf2019-04-07 23:37:15 -040048#' @rdname posterdown_html
49#' @export
50posterdown_betterland <- function(...,
51 template = find_resource("posterdown_betterland", "template.html"),
52 css = NULL) {
53 pagedown::poster_relaxed(..., css = css, template = template)
54}
Luke W Johnston79329cc2019-04-24 17:14:04 +020055
56#' @description The output format `poster_betterport()` mimics the style of the
brentthorne8ee00762019-04-24 12:57:51 -040057#' BetterPoster movement from twitter.
Luke W Johnston79329cc2019-04-24 17:14:04 +020058#' @rdname posterdown_html
59#' @export
60posterdown_betterport <- function(...,
61 template = find_resource("posterdown_betterport", "template.html"),
62 css = NULL) {
63 pagedown::poster_relaxed(..., css = css, template = template)
64}
Marc Kupietzcbe8b142023-06-24 17:48:20 +020065
66#' @description Print html code for a linked qr code to the given url
67#' @importFrom qrcode add_logo qr_code generate_svg
68#' @export
69qrlink <- function(url, logo = NULL) {
70 tmp <- tempfile(fileext = ".svg")
71 qrcode <- qrcode::qr_code(url, ecl = if(is.null(logo)) "L" else "H")
72 if(!is.null(logo)) {
73 qrcode <- qrcode::add_logo(qrcode, logo, ecl = "L")
74 }
75 qrcode::generate_svg(qrcode, tmp, show = FALSE)
76 return(paste0( sprintf('<a class="qrcode" href="%s"><img class="qrcode">', url),
Marc Kupietz24081892023-06-26 20:51:27 +020077 gsub("\r?\n|\r", "", readChar(tmp, 1e7)),
Marc Kupietzcbe8b142023-06-24 17:48:20 +020078 '</img></a>'
79 ))
80}
81