Server render invocation by slider but not by checkbox - why?

Hi alll, i do not understand how the invocation of a control element to refresh a chart works. I'm sorry I can find nothing at all in the internet about this topic, however I do not know what keywords to google...

A slider invokes the refresh of my chart after changing it. the checkbox does not. But how does it work? I mean, I have no action=renderLineChart() ore something on my slider but it works, the checkbox does not refresh the chart. How does the slider know what to do? And how can i tell a control-element what to do? I apreciate any hint!

I am using this as a template:
https://shiny.rstudio.com/gallery/nvd3-line-chart-output.html

server.r

function(input, output, session) {
  #some code to load data
  
  output$mychart <- renderLineChart({
    #....some more code
    return_my_dataframe
  })
}

ui.r

library(shiny)
library(shinydashboard)
library(shinyWidgets)

shinyUI(
  dashboardPage(
    dashboardHeader(title = "My Dashboard"),
    dashboardSidebar(
      sidebarMenu(
        menuItem("Dashboard", tabName = "dashboard", icon = icon("dashboard")),
        menuItem("Info", tabName = "info", icon = icon("info"))
      )
    ),
    dashboardBody(
      tabItems(
        
        tabItem(tabName = "dashboard",
                h2("Dashboard tab content"),
                fluidRow(
                  box(title = "title1", status = "primary", width=12,
                    column(width=12,
                           lineChartOutput("mychart")
                    )
                  )
                ),
                fluidRow(
                  box(title = "Factor", status = "primary", width=3,
                    column(width=12,
                           sliderInput("factor", "(y * 0.001 bis 0.02)", 0.001, 0.02, 0.02, step=0.001,
                                       animate=animationOptions(interval=500, loop=TRUE)),
                           sliderInput("epoche", "move (in years)", 0, 10, 0, step=1,
                                       animate=animationOptions(interval=500, loop=TRUE))
                    )
                  ),
                  box(title = "Concat Curves", status = "primary", width=3,
                      column(width=12,
                             awesomeCheckboxGroup(
                               inputId = "checkgroup2",
                               label = "Click me!",
                               choices = c("1", "2", "ALL"),
                               status = "info"
                             )
                      )
                  ) 
                )
        ),
        
        tabItem(tabName = "info",
                h2("Info"),
                fluidRow(
                  column(width=8,
                         h3("Title"),
                         p("Move slider...")
                  )
                )
        )
      )
    )
  )
)

Hugh, hmmm SOLVED!
Sorry, I just needed to reference the control input$checkgroup2 correctly in my server.r and it does all from alone! WOW!

Thank you all!

This topic was automatically closed 7 days after the last reply. New replies are no longer allowed.