Row names edit of the datatable

Hi all,

In the below application, is it possible to have , when the user clicks on rownames (1, 2, 3 etc...) the user should be able to edit entire rows(Sepal.Length, Sepal.Width etc...)

library(shiny)
library(DT)


ui <- fluidPage(tags$head(tags$script(src="https://cdnjs.cloudflare.com/ajax/libs/js-cookie/2.2.1/js.cookie.min.js")),
                tags$head(tags$script(src="app.js")
                ),
                tabsetPanel(
                  id="inTabset",
                  tabPanel(class="bs-example1","Tab 1",
                           dataTableOutput("table_out"))
                  
                )
)

server <- function(input, output, session) {
  
  output$table_out  <- DT::renderDataTable(
    datatable(
      iris,
      rownames = TRUE,
      options = list(
        fixedColumns = TRUE,
        autoWidth = TRUE,
        ordering = FALSE,
        dom = 'tB',
        buttons = c('copy', 'csv', 'excel', 'pdf')
      ),
      class = "display", #if you want to modify via .css
      extensions = "Buttons"
    )
  )
}
shinyApp(ui = ui, server = server)

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