Skip to content

Commit 1658b11

Browse files
committed
now fixing the travis
1 parent db0bed5 commit 1658b11

File tree

2 files changed

+11
-4
lines changed

2 files changed

+11
-4
lines changed

R/boxes.R

Lines changed: 7 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -120,7 +120,9 @@ infoBox <- function(title, value = NULL, subtitle = NULL,
120120
#' @param collapsed If TRUE, start collapsed. This must be used with
121121
#' \code{collapsible=TRUE}.
122122
#' @param ... Contents of the box.
123-
#' @param wrench Adds a dropdown menu
123+
#' @param wrench Adds a dropdown menu.
124+
#' @param wrenchOptions Add menu items to the wrench icon. This must be used with
125+
#' \code{wrench=TRUE}.
124126
#'
125127
#' @family boxes
126128
#'
@@ -251,7 +253,8 @@ infoBox <- function(title, value = NULL, subtitle = NULL,
251253
#' @export
252254
box <- function(..., title = NULL, footer = NULL, status = NULL,
253255
solidHeader = FALSE, background = NULL, width = 6,
254-
height = NULL, collapsible = FALSE, collapsed = FALSE, wrench = FALSE, wrenchOptions = NULL) {
256+
height = NULL, collapsible = FALSE, collapsed = FALSE,
257+
wrench = FALSE, wrenchOptions = NULL) {
255258

256259
boxClass <- "box"
257260
if (solidHeader || !is.null(background)) {
@@ -296,7 +299,8 @@ box <- function(..., title = NULL, footer = NULL, status = NULL,
296299
collapseIcon <- if (collapsed) "plus" else "minus"
297300

298301
if (collapsible == TRUE) {
299-
collapseTag <- tags$button(class = paste0("btn btn-box-tool"), `data-widget` = "collapse", shiny::icon(collapseIcon))
302+
collapseTag <- tags$button(class = paste0("btn btn-box-tool"),
303+
`data-widget` = "collapse", shiny::icon(collapseIcon))
300304
}
301305

302306
if (wrench == TRUE) {

man/box.Rd

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

0 commit comments

Comments
 (0)