Skip to content

Commit 2413cae

Browse files
committed
Put spinner example in text
So it does not run on CRAN...
1 parent 31bee6f commit 2413cae

File tree

2 files changed

+9
-8
lines changed

2 files changed

+9
-8
lines changed

R/spinner.R

Lines changed: 6 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -83,11 +83,9 @@ list_spinners <- function() {
8383
#'
8484
#' The spinner is automatically throttled to its ideal update frequency.
8585
#'
86-
#' @family spinners
87-
#' @export
88-
#' @examples
86+
#' @section Examples:
87+
#' ```
8988
#' ## Default spinner
90-
#' \donttest{
9189
#' sp1 <- make_spinner()
9290
#' fun_with_spinner <- function() {
9391
#' lapply(1:100, function(x) { sp1$spin(); Sys.sleep(0.05) })
@@ -110,7 +108,10 @@ list_spinners <- function() {
110108
#' sp2$finish()
111109
#' }
112110
#' ansi_with_hidden_cursor(fun_with_spinner3())
113-
#' }
111+
#' ```
112+
#'
113+
#' @family spinners
114+
#' @export
114115

115116
make_spinner <- function(which = NULL, stream = stderr(), template = "{spin}",
116117
static = c("dots", "print", "print_line",

man/make_spinner.Rd

Lines changed: 3 additions & 3 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)