_state.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/dropdownButton.html","id":"note","dir":"Reference","previous_headings":"","what":"Note","title":"Dropdown Button — dropdownButton","text":"pickerInput work inside dropdownButton also dropdown nest . Instead use dropdown, similar features built differently works.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/dropdownButton.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Dropdown Button — dropdownButton","text":"","code":"## Only run examples in interactive R sessions if (interactive()) { library(shiny) library(shinyWidgets) ui <- fluidPage( dropdownButton( inputId = \"mydropdown\", label = \"Controls\", icon = icon(\"sliders\"), status = \"primary\", circle = FALSE, sliderInput( inputId = \"n\", label = \"Number of observations\", min = 10, max = 100, value = 30 ), prettyToggle( inputId = \"na\", label_on = \"NAs keeped\", label_off = \"NAs removed\", icon_on = icon(\"check\"), icon_off = icon(\"xmark\") ) ), tags$div(style = \"height: 140px;\"), # spacing verbatimTextOutput(outputId = \"out\"), verbatimTextOutput(outputId = \"state\") ) server <- function(input, output, session) { output$out <- renderPrint({ cat( \" # n\\n\", input$n, \"\\n\", \"# na\\n\", input$na ) }) output$state <- renderPrint({ cat(\"Open:\", input$mydropdown_state) }) } shinyApp(ui, server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/execute_safely.html","id":null,"dir":"Reference","previous_headings":"","what":"Execute an expression safely in server — execute_safely","title":"Execute an expression safely in server — execute_safely","text":"Execute expression without generating error, instead display error user alert.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/execute_safely.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Execute an expression safely in server — execute_safely","text":"","code":"execute_safely( expr, title = \"Error\", message = \"An error occured, detail below:\", include_error = TRUE, error_return = NULL, session = shiny::getDefaultReactiveDomain() )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/execute_safely.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Execute an expression safely in server — execute_safely","text":"expr Expression evaluate title Title display alert case error. message Message display title. include_error Include error message generated R. error_return Value return case error. session Shiny session.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/execute_safely.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Execute an expression safely in server — execute_safely","text":"Result expr error, otherwise value error_return (NULL default use req reactive context).","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/execute_safely.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Execute an expression safely in server — execute_safely","text":"","code":"library(shiny) library(shinyWidgets) ui <- fluidPage( tags$h2(\"Execute code safely in server\"), fileInput( inputId = \"file\", label = \"Try to import something else than a text file (Excel for example)\" ), verbatimTextOutput(outputId = \"file_value\") ) server <- function(input, output, session) { options(warn = 2) # turns warnings into errors onStop(function() { options(warn = 0) }) r <- reactive({ req(input$file) execute_safely( read.csv(input$file$datapath) ) }) output$file_value <- renderPrint({ head(r()) }) } if (interactive()) shinyApp(ui, server)"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formaNumericInputUpdate.html","id":null,"dir":"Reference","previous_headings":"","what":"Update a Formatted Numeric Input Widget — updateCurrencyInput","title":"Update a Formatted Numeric Input Widget — updateCurrencyInput","text":"Update Formatted Numeric Input Widget","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formaNumericInputUpdate.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Update a Formatted Numeric Input Widget — updateCurrencyInput","text":"","code":"updateCurrencyInput( session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL, format = NULL ) updateFormatNumericInput( session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL, format = NULL )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formaNumericInputUpdate.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Update a Formatted Numeric Input Widget — updateCurrencyInput","text":"session Standard shiny session. inputId id input object. label label set input object. value value set input object. format format change input object .","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formaNumericInputUpdate.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Update a Formatted Numeric Input Widget — updateCurrencyInput","text":"","code":"if (interactive()) { library(shiny) library(shinyWidgets) ui <- fluidPage( tags$h2(\"Currency Input\"), currencyInput(\"id1\", \"Euro:\", value = 1234, format = \"euro\", width = 200, align = \"right\"), verbatimTextOutput(\"res1\"), actionButton(\"bttn0\", \"Change Input to Euros\"), actionButton(\"bttn1\", \"Change Input to Dollars\"), actionButton(\"bttn2\", \"Change Input to Yen\") ) server <- function(input, output, session) { output$res1 <- renderPrint(input$id1) observeEvent(input$bttn0, { updateCurrencyInput( session = session, inputId = \"id1\", label = \"Euro:\", format = \"euro\" ) }) observeEvent(input$bttn1, { updateCurrencyInput( session = session, inputId = \"id1\", label = \"Dollar:\", format = \"dollar\" ) }) observeEvent(input$bttn2, { updateCurrencyInput( session = session, inputId = \"id1\", label = \"Yen:\", format = \"Japanese\" ) }) } shinyApp(ui, server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formatNumericInput.html","id":null,"dir":"Reference","previous_headings":"","what":"Format Numeric Inputs — currencyInput","title":"Format Numeric Inputs — currencyInput","text":"Shiny widgets --type formatting currency numeric values. modifiable version see autonumericInput(). two functions exact thing named differently intuitive use (currency money, formatNumeric percentage ).","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formatNumericInput.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Format Numeric Inputs — currencyInput","text":"","code":"currencyInput( inputId, label, value, format = \"euro\", width = NULL, align = \"center\" ) formatNumericInput( inputId, label, value, format = \"commaDecimalCharDotSeparator\", width = NULL, align = \"center\" )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formatNumericInput.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Format Numeric Inputs — currencyInput","text":"inputId input slot used access value. label Display label control, NULL label. value Initial value (unformatted). format character string specifying currency format input. See \"Details\" possible values. width width input box, eg. \"200px\" \"100%\". align alignment text inside input box, one \"center\", \"left\", \"right\". Defaults \"center\".","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formatNumericInput.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Format Numeric Inputs — currencyInput","text":"currency input widget can added UI shiny app.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formatNumericInput.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Format Numeric Inputs — currencyInput","text":"regards format, currently 41 sets predefined options can used, variations one another. common : \"French\" \"Spanish\" \"NorthAmerican\" \"British\" \"Swiss\" \"Japanese\" \"Chinese\" \"Brazilian\" \"Turkish\" \"euro\" (\"French\") \"dollar\" (\"NorthAmerican\") \"percentageEU2dec\" \"percentageUS2dec\" \"dotDecimalCharCommaSeparator\" \"commaDecimalCharDotSeparator\" see full list please visit section AutoNumeric Github Page.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formatNumericInput.html","id":"references","dir":"Reference","previous_headings":"","what":"References","title":"Format Numeric Inputs — currencyInput","text":"Bonneau, Alexandre. 2018. \"AutoNumeric.js javascript Package\". http://autonumeric.org.","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/formatNumericInput.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Format Numeric Inputs — currencyInput","text":"","code":"if (interactive()) { library(shiny) library(shinyWidgets) ui <- fluidPage( tags$h2(\"Currency Input\"), currencyInput(\"id1\", \"Euro:\", value = 1234, format = \"euro\", width = 200, align = \"right\"), verbatimTextOutput(\"res1\"), currencyInput(\"id2\", \"Dollar:\", value = 1234, format = \"dollar\", width = 200, align = \"right\"), verbatimTextOutput(\"res2\"), currencyInput(\"id3\", \"Yen:\", value = 1234, format = \"Japanese\", width = 200, align = \"right\"), verbatimTextOutput(\"res3\"), br(), tags$h2(\"Formatted Numeric Input\"), formatNumericInput(\"id4\", \"Numeric:\", value = 1234, width = 200), verbatimTextOutput(\"res4\"), formatNumericInput(\"id5\", \"Percent:\", value = 1234, width = 200, format = \"percentageEU2dec\"), verbatimTextOutput(\"res5\") ) server <- function(input, output, session) { output$res1 <- renderPrint(input$id1) output$res2 <- renderPrint(input$id2) output$res3 <- renderPrint(input$id3) output$res4 <- renderPrint(input$id4) output$res5 <- renderPrint(input$id5) } shinyApp(ui, server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/html-dependencies.html","id":null,"dir":"Reference","previous_headings":"","what":"HTML dependencies — html-dependencies","title":"HTML dependencies — html-dependencies","text":"functions used internally load dependencies widgets. exported. ones needed package fresh.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/html-dependencies.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"HTML dependencies — html-dependencies","text":"","code":"html_dependency_awesome() html_dependency_bttn() html_dependency_pretty() html_dependency_bsswitch() html_dependency_sweetalert2( theme = c(\"sweetalert2\", \"minimal\", \"dark\", \"bootstrap-4\", \"material-ui\", \"bulma\", \"borderless\") )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/html-dependencies.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"HTML dependencies — html-dependencies","text":"theme SweetAlert theme use.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/html-dependencies.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"HTML dependencies — html-dependencies","text":"htmlDependency.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/html-dependencies.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"HTML dependencies — html-dependencies","text":"","code":"# Use in UI or tags function library(shiny) fluidPage( html_dependency_awesome() ) #> <\/div>"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/inputSweetAlert.html","id":null,"dir":"Reference","previous_headings":"","what":"Launch an input text dialog — inputSweetAlert","title":"Launch an input text dialog — inputSweetAlert","text":"Launch popup text input","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/inputSweetAlert.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Launch an input text dialog — inputSweetAlert","text":"","code":"inputSweetAlert( session = getDefaultReactiveDomain(), inputId, title = NULL, text = NULL, type = NULL, input = c(\"text\", \"password\", \"textarea\", \"radio\", \"checkbox\", \"select\", \"email\", \"url\"), inputOptions = NULL, inputPlaceholder = NULL, inputValidator = NULL, btn_labels = \"Ok\", btn_colors = NULL, reset_input = TRUE, ... )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/inputSweetAlert.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Launch an input text dialog — inputSweetAlert","text":"session session object passed function given shinyServer. inputId input slot used access value. Shiny module, use logic inputs : use namespace UI, server. title Title pop-. text Text pop-. type Type pop-: \"info\", \"success\", \"warning\", \"error\" \"question\". input Type input, possible values : \"text\", \"password\",\"textarea\", \"radio\", \"checkbox\" \"select\". inputOptions Options input. \"radio\" \"select\" choices. inputPlaceholder Placeholder input, use \"text\" \"checkbox\". inputValidator JavaScript function validate input. Must character wrapped (). btn_labels Label(s) button(s). btn_colors Color(s) button(s). reset_input Set input value NULL alert displayed. ... arguments passed JavaScript method.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/inputSweetAlert.html","id":"note","dir":"Reference","previous_headings":"","what":"Note","title":"Launch an input text dialog — inputSweetAlert","text":"function use JavaScript sweetalert2 library, see official documentation https://sweetalert2.github.io/.","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/inputSweetAlert.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Launch an input text dialog — inputSweetAlert","text":"","code":"# Input in alert ---- library(shiny) library(shinyWidgets) ui <- fluidPage( tags$h1(\"Input sweet alert\"), actionButton(\"btn_text\", \"Text Input\"), verbatimTextOutput(outputId = \"text\"), actionButton(\"btn_password\", \"Password Input\"), verbatimTextOutput(outputId = \"password\"), actionButton(\"btn_radio\", \"Radio Input\"), verbatimTextOutput(outputId = \"radio\"), actionButton(\"btn_checkbox\", \"Checkbox Input\"), verbatimTextOutput(outputId = \"checkbox\"), actionButton(\"btn_select\", \"Select Input\"), verbatimTextOutput(outputId = \"select\"), actionButton(\"btn_email\", \"Email Input\"), verbatimTextOutput(outputId = \"email\") ) server <- function(input, output, session) { observeEvent(input$btn_text, { inputSweetAlert( session = session, \"mytext\", input = \"text\", title = \"What's your name ?\", inputPlaceholder = \"e.g.: Victor\", allowOutsideClick = FALSE, showCloseButton = TRUE ) }) output$text <- renderPrint(input$mytext) observeEvent(input$btn_password, { inputSweetAlert( session = session, \"mypassword\", input = \"password\", title = \"What's your password ?\" ) }) output$password <- renderPrint(input$mypassword) observeEvent(input$btn_radio, { inputSweetAlert( session = session, \"myradio\", input = \"radio\", inputOptions = c(\"Banana\" , \"Orange\", \"Apple\"), title = \"What's your favorite fruit ?\", inputValidator = I( \"function(value) { if (!value) { return 'You need to choose something!'; } }\" ) ) }) output$radio <- renderPrint(input$myradio) observeEvent(input$btn_checkbox, { inputSweetAlert( session = session, \"mycheckbox\", input = \"checkbox\", inputPlaceholder = \"Yes I agree\", title = \"Do you agree ?\" ) }) output$checkbox <- renderPrint(input$mycheckbox) observeEvent(input$btn_select, { inputSweetAlert( session = session, \"myselect\", input = \"select\", inputOptions = c(\"Banana\" , \"Orange\", \"Apple\"), title = \"What's your favorite fruit ?\" ) }) output$select <- renderPrint(input$myselect) observeEvent(input$btn_email, { inputSweetAlert( session = session, inputId = \"myemail\", input = \"email\", title = \"What's your email ?\", validationMessage= \"this does not look like a valid email!\" ) }) output$email <- renderPrint(input$myemail) } if (interactive()) shinyApp(ui = ui, server = server)"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/knobInput.html","id":null,"dir":"Reference","previous_headings":"","what":"Knob Input — knobInput","title":"Knob Input — knobInput","text":"Knob Input","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/knobInput.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Knob Input — knobInput","text":"","code":"knobInput( inputId, label, value, min = 0, max = 100, step = 1, angleOffset = 0, angleArc = 360, cursor = FALSE, thickness = NULL, lineCap = c(\"default\", \"round\"), displayInput = TRUE, displayPrevious = FALSE, rotation = c(\"clockwise\", \"anticlockwise\"), fgColor = NULL, inputColor = NULL, bgColor = NULL, pre = NULL, post = NULL, fontSize = NULL, readOnly = FALSE, skin = NULL, width = NULL, height = NULL, immediate = TRUE )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/knobInput.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Knob Input — knobInput","text":"inputId input slot used access value. label Display label control, NULL label. value Initial value. min Minimum allowed value, default 0. max Maximum allowed value, default 100. step Specifies interval selectable value, default 1. angleOffset Starting angle degrees, default 0. angleArc Arc size degrees, default 360. cursor Display mode \"cursor\", work properly width set pixel, (TRUE FALSE). thickness Gauge thickness, numeric value. lineCap Gauge stroke endings, 'default' 'round'. displayInput Hide input middle knob (TRUE FALSE). displayPrevious Display previous value transparency (TRUE FALSE). rotation Direction progression, 'clockwise' 'anticlockwise'. fgColor Foreground color. inputColor Input value (number) color. bgColor Background color. pre prefix string put front value. post suffix string put value. fontSize Font size, must valid CSS unit. readOnly Disable knob (TRUE FALSE). skin Change Knob skin, one option available : 'tron'. width, height width height input, e.g. 400px, 100%. value pixel recommended, otherwise knob able initialize case (hidden start example). immediate TRUE (default), server-side value updated time value change, FALSE value updated user release widget.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/knobInput.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Knob Input — knobInput","text":"Numeric value server-side.","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/knobInput.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Knob Input — knobInput","text":"","code":"if (interactive()) { library(\"shiny\") library(\"shinyWidgets\") ui <- fluidPage( knobInput( inputId = \"myKnob\", label = \"Display previous:\", value = 50, min = -100, displayPrevious = TRUE, fgColor = \"#428BCA\", inputColor = \"#428BCA\" ), verbatimTextOutput(outputId = \"res\") ) server <- function(input, output, session) { output$res <- renderPrint(input$myKnob) } shinyApp(ui = ui, server = server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/materialSwitch.html","id":null,"dir":"Reference","previous_headings":"","what":"Material Design Switch Input Control — materialSwitch","title":"Material Design Switch Input Control — materialSwitch","text":"toggle switch turn selection .","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/materialSwitch.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Material Design Switch Input Control — materialSwitch","text":"","code":"materialSwitch( inputId, label = NULL, value = FALSE, status = \"default\", right = FALSE, inline = FALSE, width = NULL )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/materialSwitch.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Material Design Switch Input Control — materialSwitch","text":"inputId input slot used access value. label Input label. value TRUE FALSE. status Color, must valid Bootstrap status : default, primary, info, success, warning, danger. right label right? default FALSE. inline Display input inline, want place buttons next . width width input, e.g. 400px, 100%.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/materialSwitch.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Material Design Switch Input Control — materialSwitch","text":"switch control can added UI definition.","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/materialSwitch.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Material Design Switch Input Control — materialSwitch","text":"","code":"if (interactive()) { library(shiny) library(shinyWidgets) ui <- fluidPage( tags$h3(\"Material switch examples\"), materialSwitch(inputId = \"switch1\", label = \"Night mode\"), verbatimTextOutput(\"value1\"), materialSwitch(inputId = \"switch2\", label = \"Night mode\", status = \"danger\"), verbatimTextOutput(\"value2\") ) server <- function(input, output) { output$value1 <- renderText({ input$switch1 }) output$value2 <- renderText({ input$switch2 }) } shinyApp(ui, server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/multiInput.html","id":null,"dir":"Reference","previous_headings":"","what":"Create a multiselect input control — multiInput","title":"Create a multiselect input control — multiInput","text":"user-friendly replacement select boxes multiple attribute","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/multiInput.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create a multiselect input control — multiInput","text":"","code":"multiInput( inputId, label, choices = NULL, selected = NULL, options = NULL, width = NULL, choiceNames = NULL, choiceValues = NULL )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/multiInput.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create a multiselect input control — multiInput","text":"inputId input slot used access value. label Display label control, NULL label. choices List values select . selected initially selected value. options List options passed multi (enable_search = FALSE disabling search bar example). width width input, e.g. 400px, 100%. choiceNames List names display user. choiceValues List values corresponding choiceNames.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/multiInput.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Create a multiselect input control — multiInput","text":"multiselect control can added UI shiny app.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/multiInput.html","id":"references","dir":"Reference","previous_headings":"","what":"References","title":"Create a multiselect input control — multiInput","text":"Fabian Lindfors, \"user-friendly replacement select boxes multiple attribute enabled\", https://github.com/fabianlindfors/multi.js.","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/multiInput.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Create a multiselect input control — multiInput","text":"","code":"## Only run examples in interactive R sessions if (interactive()) { library(\"shiny\") library(\"shinyWidgets\") # simple use ui <- fluidPage( multiInput( inputId = \"id\", label = \"Fruits :\", choices = c(\"Banana\", \"Blueberry\", \"Cherry\", \"Coconut\", \"Grapefruit\", \"Kiwi\", \"Lemon\", \"Lime\", \"Mango\", \"Orange\", \"Papaya\"), selected = \"Banana\", width = \"350px\" ), verbatimTextOutput(outputId = \"res\") ) server <- function(input, output, session) { output$res <- renderPrint({ input$id }) } shinyApp(ui = ui, server = server) # with options ui <- fluidPage( multiInput( inputId = \"id\", label = \"Fruits :\", choices = c(\"Banana\", \"Blueberry\", \"Cherry\", \"Coconut\", \"Grapefruit\", \"Kiwi\", \"Lemon\", \"Lime\", \"Mango\", \"Orange\", \"Papaya\"), selected = \"Banana\", width = \"400px\", options = list( enable_search = FALSE, non_selected_header = \"Choose between:\", selected_header = \"You have selected:\" ) ), verbatimTextOutput(outputId = \"res\") ) server <- function(input, output, session) { output$res <- renderPrint({ input$id }) } shinyApp(ui = ui, server = server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/noUiSliderInput.html","id":null,"dir":"Reference","previous_headings":"","what":"Numeric range slider — noUiSliderInput","title":"Numeric range slider — noUiSliderInput","text":"minimal numeric range slider lot features.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/noUiSliderInput.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Numeric range slider — noUiSliderInput","text":"","code":"noUiSliderInput( inputId, label = NULL, min, max, value, step = NULL, tooltips = TRUE, connect = TRUE, padding = 0, margin = NULL, limit = NULL, orientation = c(\"horizontal\", \"vertical\"), direction = c(\"ltr\", \"rtl\"), behaviour = \"tap\", range = NULL, pips = NULL, format = wNumbFormat(), update_on = c(\"end\", \"change\"), color = NULL, inline = FALSE, width = NULL, height = NULL )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/noUiSliderInput.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Numeric range slider — noUiSliderInput","text":"inputId input slot used access value. label Display label control, NULL label. min Minimal value can selected. max Maximal value can selected. value initial value slider. many cursors created values provided. step numeric, default, slider slides fluently. order make handles jump intervals, can use step option. tooltips logical, display slider's value tooltip slider. connect logical, vector length value + 1, color slider handle(s). padding numeric, padding limits close slider edges handles can . margin numeric, using two handles, minimum distance handles can set using margin option. limit numeric, limit option opposite margin option, limiting maximum distance two handles. orientation orientation setting can used set slider \"vertical\" \"horizontal\". direction \"ltr\" \"rtl\", default sliders top--bottom left--right, can change using direction option, decides upper side slider . behaviour Option handle user interaction, value several \"drag\", \"tap\", \"fixed\", \"snap\" \"none\". See https://refreshless.com/nouislider/behaviour-option/ examples. range list, can used define non-linear sliders. pips list, used generate points along slider. format numbers format, see wNumbFormat. update_on send value server: \"end\" (slider released) \"update\" (time value changes). color color Hex format slider. inline TRUE, possible position sliders side--side. width width input, e.g. 400px, 100%. height height input, e.g. 400px, 100%.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/noUiSliderInput.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Numeric range slider — noUiSliderInput","text":"ui definition","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/noUiSliderInput.html","id":"note","dir":"Reference","previous_headings":"","what":"Note","title":"Numeric range slider — noUiSliderInput","text":"See updateNoUiSliderInput() updating slider value server-side. demoNoUiSlider() examples.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/noUiSliderInput.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Numeric range slider — noUiSliderInput","text":"","code":"library(shiny) library(shinyWidgets) ui <- fluidPage( tags$h2(\"noUiSliderInput example\"), noUiSliderInput( inputId = \"noui1\", min = 0, max = 100, value = 20 ), verbatimTextOutput(outputId = \"res1\"), tags$br(), noUiSliderInput( inputId = \"noui2\", label = \"Slider vertical:\", min = 0, max = 1000, step = 50, value = c(100, 400), margin = 100, orientation = \"vertical\", width = \"100px\", height = \"300px\" ), verbatimTextOutput(outputId = \"res2\") ) server <- function(input, output, session) { output$res1 <- renderPrint(input$noui1) output$res2 <- renderPrint(input$noui2) } if (interactive()) shinyApp(ui, server)"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericInputIcon.html","id":null,"dir":"Reference","previous_headings":"","what":"Create a numeric input control with icon(s) — numericInputIcon","title":"Create a numeric input control with icon(s) — numericInputIcon","text":"Extend form controls adding text icons , , sides classic numericInput.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericInputIcon.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create a numeric input control with icon(s) — numericInputIcon","text":"","code":"numericInputIcon( inputId, label, value, min = NULL, max = NULL, step = NULL, icon = NULL, size = NULL, help_text = NULL, width = NULL )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericInputIcon.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create a numeric input control with icon(s) — numericInputIcon","text":"inputId input slot used access value. label Display label control, NULL label. value Initial value. min Minimum allowed value max Maximum allowed value step Interval use stepping min max icon shiny::icon() (equivalent) list, containing icons text, displayed right left text input. size Size input, default NULL, can \"sm\" (small) \"lg\" (large). help_text Help text placed widget displayed value entered user outside min max. width width input, e.g. '400px', '100%'; see validateCssUnit().","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericInputIcon.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Create a numeric input control with icon(s) — numericInputIcon","text":"numeric input control can added UI definition.","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericInputIcon.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Create a numeric input control with icon(s) — numericInputIcon","text":"","code":"library(shiny) library(shinyWidgets) ui <- fluidPage( # Test with different version of Bootstrap # theme = bslib::bs_theme(version = 5), tags$h2(\"numericInputIcon examples\"), fluidRow( column( width = 6, numericInputIcon( inputId = \"ex1\", label = \"With an icon\", value = 10, icon = icon(\"percent\") ), verbatimTextOutput(\"res1\"), numericInputIcon( inputId = \"ex2\", label = \"With an icon (right)\", value = 90, step = 10, icon = list(NULL, icon(\"percent\")) ), verbatimTextOutput(\"res2\"), numericInputIcon( inputId = \"ex3\", label = \"With text\", value = 50, icon = list(\"km/h\") ), verbatimTextOutput(\"res3\"), numericInputIcon( inputId = \"ex4\", label = \"Both side\", value = 10000, icon = list(icon(\"dollar-sign\"), \".00\") ), verbatimTextOutput(\"res4\"), numericInputIcon( inputId = \"ex5\", label = \"Sizing\", value = 10000, icon = list(icon(\"dollar-sign\"), \".00\"), size = \"lg\" ), verbatimTextOutput(\"res5\") ) ) ) server <- function(input, output, session) { output$res1 <- renderPrint(input$ex1) output$res2 <- renderPrint(input$ex2) output$res3 <- renderPrint(input$ex3) output$res4 <- renderPrint(input$ex4) output$res5 <- renderPrint(input$ex5) } if (interactive()) shinyApp(ui, server)"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericRangeInput.html","id":null,"dir":"Reference","previous_headings":"","what":"Numeric Range Input — numericRangeInput","title":"Numeric Range Input — numericRangeInput","text":"Create input group numeric inputs function range input.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericRangeInput.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Numeric Range Input — numericRangeInput","text":"","code":"numericRangeInput( inputId, label, value, width = NULL, separator = \" to \", min = NA, max = NA, step = NA )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericRangeInput.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Numeric Range Input — numericRangeInput","text":"inputId input slot used access value. label Display label control, NULL label. value initial value(s) range. numeric vector length one duplicated represent minimum maximum range; numeric vector two minimum maximum set minimum maximum range. width width input, e.g. '400px', '100%'; see validateCssUnit(). separator String display start end input boxes. min Minimum allowed value max Maximum allowed value step Interval use stepping min max","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/numericRangeInput.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Numeric Range Input — numericRangeInput","text":"","code":"if (interactive()) { ### examples ---- # see ?demoNumericRange demoNumericRange() ### basic usage ---- library( shiny ) library( shinyWidgets ) ui <- fluidPage( tags$br(), numericRangeInput( inputId = \"my_id\", label = \"Numeric Range Input:\", value = c(100, 400) ), verbatimTextOutput(outputId = \"res1\") ) server <- function(input, output, session) { output$res1 <- renderPrint(input$my_id) } shinyApp(ui, server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerGroup-module.html","id":null,"dir":"Reference","previous_headings":"","what":"Picker Group — pickerGroup-module","title":"Picker Group — pickerGroup-module","text":"Group mutually dependent pickerInput filtering data.frame's columns.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerGroup-module.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Picker Group — pickerGroup-module","text":"","code":"pickerGroupUI( id, params, label = NULL, btn_label = \"Reset filters\", options = list(), inline = TRUE ) pickerGroupServer(input, output, session, data, vars)"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerGroup-module.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Picker Group — pickerGroup-module","text":"id Module's id. params named list parameters passed pickerInput, can use : inputId (obligatory, must variable name), label, placeholder. label Character, global label top labels. btn_label Character, reset button label. options See pickerInput options argument. inline TRUE (default), pickerInputs horizontally positioned, otherwise vertically. input standard shiny input. output standard shiny output. session standard shiny session. data data.frame, object can coerced data.frame. vars character, columns use create filters, must correspond variables listed params.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerGroup-module.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Picker Group — pickerGroup-module","text":"reactive function containing data filtered.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerGroup-module.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Picker Group — pickerGroup-module","text":"","code":"if (interactive()) { library(shiny) library(shinyWidgets) data(\"mpg\", package = \"ggplot2\") ui <- fluidPage( fluidRow( column( width = 10, offset = 1, tags$h3(\"Filter data with picker group\"), panel( pickerGroupUI( id = \"my-filters\", params = list( manufacturer = list(inputId = \"manufacturer\", label = \"Manufacturer:\"), model = list(inputId = \"model\", label = \"Model:\"), trans = list(inputId = \"trans\", label = \"Trans:\"), class = list(inputId = \"class\", label = \"Class:\") ) ), status = \"primary\" ), DT::dataTableOutput(outputId = \"table\") ) ) ) server <- function(input, output, session) { res_mod <- callModule( module = pickerGroupServer, id = \"my-filters\", data = mpg, vars = c(\"manufacturer\", \"model\", \"trans\", \"class\") ) output$table <- DT::renderDataTable(res_mod()) } shinyApp(ui, server) } ### Not inline example if (interactive()) { library(shiny) library(shinyWidgets) data(\"mpg\", package = \"ggplot2\") ui <- fluidPage( fluidRow( column( width = 4, tags$h3(\"Filter data with picker group\"), pickerGroupUI( id = \"my-filters\", inline = FALSE, params = list( manufacturer = list(inputId = \"manufacturer\", label = \"Manufacturer:\"), model = list(inputId = \"model\", label = \"Model:\"), trans = list(inputId = \"trans\", label = \"Trans:\"), class = list(inputId = \"class\", label = \"Class:\") ) ) ), column( width = 8, DT::dataTableOutput(outputId = \"table\") ) ) ) server <- function(input, output, session) { res_mod <- callModule( module = pickerGroupServer, id = \"my-filters\", data = mpg, vars = c(\"manufacturer\", \"model\", \"trans\", \"class\") ) output$table <- DT::renderDataTable(res_mod()) } shinyApp(ui, server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerInput.html","id":null,"dir":"Reference","previous_headings":"","what":"Select Picker Input Control — pickerInput","title":"Select Picker Input Control — pickerInput","text":"alternative shiny::selectInput() plenty options customize .","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerInput.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Select Picker Input Control — pickerInput","text":"","code":"pickerInput( inputId, label = NULL, choices, selected = NULL, multiple = FALSE, options = list(), choicesOpt = NULL, width = NULL, inline = FALSE, stateInput = TRUE )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerInput.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Select Picker Input Control — pickerInput","text":"inputId input slot used access value. label Display label control, NULL label. choices List values select . elements list named name rather value displayed user. selected initially selected value (multiple values multiple = TRUE). specified defaults first value single-select lists values multiple select lists. multiple selection multiple items allowed? options List options, see pickerOptions available options. limit number selection possible, see example . choicesOpt list() options individual choices dropdown menu, element list length choices. can use following options : disabled: logical vector indicating choice can selected . style: CSS styles applied choice tag class: CSS class added choice tag icon: vector icon names display choices (use icon(\"arrow-right\"), use fa-arrow-right pickerOptions(iconBase = \"fas\")) subtext add text choice content: replace entire choice custom content (like raw HTML) tokens: add tokens associated choices used search results. width width input : 'auto', 'fit', '100px', '75%'. inline Display picker inline, label menu line use width = \"fit\". stateInput Activate deactivate special input value input$_open know menu opened , see details.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerInput.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Select Picker Input Control — pickerInput","text":"select control can added UI definition.","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerInput.html","id":"note","dir":"Reference","previous_headings":"","what":"Note","title":"Select Picker Input Control — pickerInput","text":"State picker (open close) accessible server-side input value: input$_open, can TRUE (opened) FALSE (closed).","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerInput.html","id":"references","dir":"Reference","previous_headings":"","what":"References","title":"Select Picker Input Control — pickerInput","text":"SnapAppointments contributors. \"jQuery plugin brings select elements 21st century intuitive multiselection, searching, much . Now Bootstrap 4 support\". https://github.com/snapappointments/bootstrap-select/","code":""},{"path":[]},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerInput.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Select Picker Input Control — pickerInput","text":"","code":"## Only run examples in interactive R sessions if (interactive()) { # You can run the gallery to see other examples shinyWidgetsGallery() # Basic usage library(\"shiny\") library(shinyWidgets) ui <- fluidPage( pickerInput( inputId = \"somevalue\", label = \"A label\", choices = c(\"a\", \"b\") ), verbatimTextOutput(\"value\") ) server <- function(input, output) { output$value <- renderPrint(input$somevalue) } shinyApp(ui, server) } ### Add actions box for selecting ---- ### deselecting all options if (interactive()) { library(shiny) library(shinyWidgets) ui <- fluidPage( tags$h2(\"Select / Deselect all\"), pickerInput( inputId = \"p1\", label = \"Select all option\", choices = rownames(mtcars), multiple = TRUE, options = list(`actions-box` = TRUE) ), verbatimTextOutput(\"r1\"), br(), pickerInput( inputId = \"p2\", label = \"Select all option / custom text\", choices = rownames(mtcars), multiple = TRUE, options = list( `actions-box` = TRUE, `deselect-all-text` = \"None...\", `select-all-text` = \"Yeah, all !\", `none-selected-text` = \"zero\" ) ), verbatimTextOutput(\"r2\") ) server <- function(input, output, session) { output$r1 <- renderPrint(input$p1) output$r2 <- renderPrint(input$p2) } shinyApp(ui = ui, server = server) } ### Customize the values displayed in the box ---- if (interactive()) { library(shiny) library(shinyWidgets) ui <- fluidPage( br(), pickerInput( inputId = \"p1\", label = \"Default\", multiple = TRUE, choices = rownames(mtcars), selected = rownames(mtcars)[1:5] ), br(), pickerInput( inputId = \"p1b\", label = \"Default with | separator\", multiple = TRUE, choices = rownames(mtcars), selected = rownames(mtcars)[1:5], options = list(`multiple-separator` = \" | \") ), br(), pickerInput( inputId = \"p2\", label = \"Static\", multiple = TRUE, choices = rownames(mtcars), selected = rownames(mtcars)[1:5], options = list(`selected-text-format`= \"static\", title = \"Won't change\") ), br(), pickerInput( inputId = \"p3\", label = \"Count\", multiple = TRUE, choices = rownames(mtcars), selected = rownames(mtcars)[1:5], options = list(`selected-text-format`= \"count\") ), br(), pickerInput( inputId = \"p3\", label = \"Customize count\", multiple = TRUE, choices = rownames(mtcars), selected = rownames(mtcars)[1:5], options = list( `selected-text-format`= \"count\", `count-selected-text` = \"{0} models choosed (on a total of {1})\" ) ) ) server <- function(input, output, session) { } shinyApp(ui = ui, server = server) } ### Limit the number of selections ---- if (interactive()) { library(shiny) library(shinyWidgets) ui <- fluidPage( pickerInput( inputId = \"groups\", label = \"Select one from each group below:\", choices = list( Group1 = c(\"1\", \"2\", \"3\", \"4\"), Group2 = c(\"A\", \"B\", \"C\", \"D\") ), multiple = TRUE, options = list(\"max-options-group\" = 1) ), verbatimTextOutput(outputId = \"res_grp\"), pickerInput( inputId = \"groups_2\", label = \"Select two from each group below:\", choices = list( Group1 = c(\"1\", \"2\", \"3\", \"4\"), Group2 = c(\"A\", \"B\", \"C\", \"D\") ), multiple = TRUE, options = list(\"max-options-group\" = 2) ), verbatimTextOutput(outputId = \"res_grp_2\"), pickerInput( inputId = \"classic\", label = \"Select max two option below:\", choices = c(\"A\", \"B\", \"C\", \"D\"), multiple = TRUE, options = list( \"max-options\" = 2, \"max-options-text\" = \"No more!\" ) ), verbatimTextOutput(outputId = \"res_classic\") ) server <- function(input, output) { output$res_grp <- renderPrint(input$groups) output$res_grp_2 <- renderPrint(input$groups_2) output$res_classic <- renderPrint(input$classic) } shinyApp(ui, server) }"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerOptions.html","id":null,"dir":"Reference","previous_headings":"","what":"Options for pickerInput — pickerOptions","title":"Options for pickerInput — pickerOptions","text":"Wrapper options available : https://developer.snapappointments.com/bootstrap-select/options/","code":""},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerOptions.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Options for pickerInput — pickerOptions","text":"","code":"pickerOptions( actionsBox = NULL, container = NULL, countSelectedText = NULL, deselectAllText = NULL, dropdownAlignRight = NULL, dropupAuto = NULL, header = NULL, hideDisabled = NULL, iconBase = NULL, liveSearch = NULL, liveSearchNormalize = NULL, liveSearchPlaceholder = NULL, liveSearchStyle = NULL, maxOptions = NULL, maxOptionsText = NULL, mobile = NULL, multipleSeparator = NULL, noneSelectedText = NULL, noneResultsText = NULL, selectAllText = NULL, selectedTextFormat = NULL, selectOnTab = NULL, showContent = NULL, showIcon = NULL, showSubtext = NULL, showTick = NULL, size = NULL, style = NULL, tickIcon = NULL, title = NULL, virtualScroll = NULL, width = NULL, windowPadding = NULL, ... )"},{"path":"https://dreamrs.github.io/shinyWidgets/reference/pickerOptions.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Options for pickerInput — pickerOptions","text":"actionsBox set true, adds two buttons top dropdown menu (Select & Deselect ). Type: boolean; Default: false. container set string, appends select specific element selector, e.g., container: 'body' | '.main-body' Type: string | false; Default: false. countSelectedText Sets format text displayed selectedTextFormat count count > #. {0} selected amount. {1} total available selection. set function, first parameter number selected options, second total number options. function must return string. Type: string | function; Default: function. deselectAllText text button deselects options actionsBox enabled. Type: string; Default: 'Deselect '. dropdownAlignRight Align menu right instead left. set 'auto', menu automatically align right room menu's full width aligned left. Type: boolean | 'auto'; Default: false. dropupAuto checks see room, . dropup enough room fully open normally, room , dropup still opens normally. Otherwise, becomes dropup. dropupAuto set false, dropups must called manually. Type: boolean; Default: true. header adds header top menu; includes close button default Type: string; Default: false. hideDisabled removes disabled options optgroups menu data-hide-disabled: true Type: boolean; Default: false. iconBase Set base use different icon font instead Glyphicons. changing iconBase, might also want change tickIcon, case new icon font uses different naming scheme. Type: string; Default: 'glyphicon'. liveSearch set true, adds search box top selectpicker dropdown. Type: boolean; Default: false. liveSearchNormalize Setting liveSearchNormalize true allows accent-insensitive searching. Type: boolean; Default: false. liveSearchPlaceholder set string, placeholder attribute equal string added liveSearch input. Type: string; Default: null. liveSearchStyle set 'contains', searching reveal options contain searched text. example, searching pl return Apple, Plum, Plantain. set 'startsWith', searching pl return Plum Plantain. Type: string; Default: 'contains'. maxOptions set integer multi-select, number selected options exceed given value. option can also exist data-attribute