inst/examples/shiny/DT/ui.R

library(ggiraph)
library(htmltools)
shinyUI(fluidPage(
  fluidRow(
    column(width=12,
           includeScript(path = "set_search_val.js"),
           h4("click a point, the data table will be filtered...")
           )
  ),

  fluidRow(
    column(width=6,
      girafeOutput("plot_")
    ),
    column(width=6,
           DT::dataTableOutput("dt_")
    )
  )
))

Try the ggiraph package in your browser

Any scripts or data that you put into this service are public.

ggiraph documentation built on March 31, 2023, 9:53 p.m.