Skip to content

Commit

Permalink
Clean Rd docs
Browse files Browse the repository at this point in the history
  • Loading branch information
cpsievert committed Oct 6, 2023
1 parent e450104 commit f5caf7e
Show file tree
Hide file tree
Showing 2 changed files with 11 additions and 8 deletions.
9 changes: 5 additions & 4 deletions R/html_print.R
Original file line number Diff line number Diff line change
Expand Up @@ -62,19 +62,20 @@ html_print <- function(html, background = "white", viewer = getOption("viewer",
#' An S3 generic method for saving an HTML-like object to a file. The default
#' method copies dependency files to the directory specified via `libdir`.
#'
#' @param html HTML content to print
#' @param html HTML content to print.
#' @param file File path or connection. If a file path containing a
#' sub-directory, the sub-directory must already exist.
#' @param background Background color for web page
#' @param libdir Directory to copy dependencies to
#' @param lang Value of the `<html>` `lang` attribute
#' @param ... Further arguments passed to other methods.
#'
#' @export
save_html <- function(html, file, ...) {
UseMethod("save_html")
}

#' @rdname save_html
#' @param background Background color for web page.
#' @param libdir Directory to copy dependencies to.
#' @param lang Value of the `<html>` `lang` attribute.
#' @export
save_html.default <- function(html, file, background = "white", libdir = "lib", lang = "en", ...) {
rlang::check_dots_empty()
Expand Down
10 changes: 6 additions & 4 deletions man/save_html.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit f5caf7e

Please sign in to comment.