Skip to content

Commit

Permalink
Use sass package from CRAN (not GitHub) (#313)
Browse files Browse the repository at this point in the history
* Remove `rstudio/sass` from Remotes list

* Increase minimum version of `sass` in Imports

* Add `library(shiny)` to roxygen @examples

* Update help files using roxygen
  • Loading branch information
rich-iannone authored Jul 5, 2019
1 parent 456b232 commit 2b57e0d
Show file tree
Hide file tree
Showing 4 changed files with 9 additions and 3 deletions.
4 changes: 1 addition & 3 deletions DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -34,13 +34,11 @@ Imports:
magrittr (>= 1.5),
rlang (>= 0.3.0),
scales (>= 1.0.0),
sass (>= 0.1.0),
sass (>= 0.1.1),
stringr (>= 1.3.1),
tibble (>= 1.4.2),
tidyr (>= 0.8.2),
tidyselect (>= 0.2.5)
Remotes:
rstudio/sass
Suggests:
knitr,
paletteer,
Expand Down
4 changes: 4 additions & 0 deletions R/shiny.R
Original file line number Diff line number Diff line change
Expand Up @@ -32,6 +32,8 @@
#' document.
#'
#' @examples
#' library(shiny)
#'
#' # Here is a Shiny app (contained within
#' # a single file) that (1) prepares a
#' # gt table, (2) sets up the `ui` with
Expand Down Expand Up @@ -147,6 +149,8 @@ render_gt <- function(expr,
#' @param outputId An output variable from which to read the table.
#'
#' @examples
#' library(shiny)
#'
#' # Here is a Shiny app (contained within
#' # a single file) that (1) prepares a
#' # gt table, (2) sets up the `ui` with
Expand Down
2 changes: 2 additions & 0 deletions man/gt_output.Rd

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

2 changes: 2 additions & 0 deletions man/render_gt.Rd

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

0 comments on commit 2b57e0d

Please sign in to comment.