Skip to content
This repository has been archived by the owner on Feb 9, 2024. It is now read-only.

Commit

Permalink
Change example so it doesn't open browser during R CMD check
Browse files Browse the repository at this point in the history
  • Loading branch information
wch committed Sep 30, 2020
1 parent ce39f44 commit 4485929
Show file tree
Hide file tree
Showing 2 changed files with 6 additions and 0 deletions.
3 changes: 3 additions & 0 deletions R/print.R
Original file line number Diff line number Diff line change
Expand Up @@ -64,13 +64,16 @@ print.ggvis <- function(x, dynamic = NA, launch = interactive(), ...) {
#' @param plot_id Unique identifier used to identify the plot on the page.
#' @param dest Deprecated (this no longer works).
#' @examples
#' ## Run these examples only in interactive R sessions
#' if (interactive()) {
#' # In most cases view_static is unnecessary; these will do the same thing:
#' mtcars %>% ggvis(~wt, ~mpg)
#' mtcars %>% ggvis(~wt, ~mpg) %>% view_static()
#'
#' # Can find the output file with view_static() and html_print()
#' outfile <- mtcars %>% ggvis(~wt, ~mpg) %>%
#' view_static() %>% htmltools::html_print(viewer = NULL)
#' }
view_static <- function(x, plot_id = rand_id("plot_"), dest = NULL) {


Expand Down
3 changes: 3 additions & 0 deletions man/print.ggvis.Rd

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

0 comments on commit 4485929

Please sign in to comment.