frappeChart <- function(data, type = "line", is_navigable = TRUE, width = NULL, height = NULL, elementId = NULL) {
# forward options using x
x = list(
data = processData(data, type),
isNavigable = is_navigable
)
# create widget
htmlwidgets::createWidget(
name = 'frappeChart',
x,
width = width,
height = height,
package = 'frappeCharts',
elementId = elementId
)
}
devtools::install_github('gadenbuie/js4shiny-frappeCharts', repos = NULL)
dependencies = TRUE
, then it also installed golem
for you
devtools::install_github("gadenbuie/js4shiny-frappeCharts@pkg")
@ColinFay I got lost at https://github.com/ColinFay/shinynotifyjs#calling-custom-handler Hm... were we supposed to edit the R/app_server.R
file? I tried
#' @import shiny
app_server <- function(input, output,session) {
# List the first level callModules here
session$sendCustomMessage("fun", arg)
}
But that lead me to an error when running dev/run_dev.R
(Error in writeImpl: Text to be written must be a length-one character vector
)
library(shiny)
library(htmltools)
typingSpeedInput <- function(inputId, label, placeholder = NULL) {
div(
class = "form-group typing-speed",
tags$label(class = "control-label", `for` = inputId, label),
tags$textarea(id = inputId, class = "form-control", placeholder = placeholder)
)
}
ui <- fluidPage(
typingSpeedInput("typing", "Type here ..."),
verbatimTextOutput("debug")
)
server <- function(input, output, session) {
output$debug <- renderPrint(input$typing)
}
shinyApp(ui, server)