rstudio / shinydashboard

Shiny Dashboarding framework
https://rstudio.github.io/shinydashboard/
Other
886 stars 300 forks source link

Why shiny dashboard says that pip broken #321

Closed beginner984 closed 5 years ago

beginner984 commented 5 years ago

Hi,

I have this shiny app its data table not working and not showing any table and says that

Listening on http://127.0.0.1:4994
ERROR: [uv_write] broken pipe

This is code of my shiny

library(shiny)
library(shinydashboard)
library(shinyBS)
library(DT)

ui <- dashboardPage(
  dashboardHeader(),
  dashboardSidebar(

  ),
  dashboardBody(

    mainPanel(

      tabsetPanel(

        tabPanel("Data", value=2,

                 fluidRow(

                   valueBoxOutput("vbox1", width = 2),
                   valueBoxOutput("vbox2", width = 2),
                   valueBoxOutput("vbox3", width = 2),
                   valueBoxOutput("vbox4", width = 2),
                   valueBoxOutput("vbox5", width = 2),
                   valueBoxOutput("vbox6", width = 2)

                 ),

                 fluidRow(

                   column(width = 4,  box(title = "Iris", width = NULL, solidHeader = FALSE, d3heatmapOutput("heatmap", width = "100%", height="600px"))),
                   column(width = 4,  box(title = "MT Cars", width = NULL, solidHeader = FALSE, dataTableOutput("dat2"))),
                   column(width = 4,  box(title = "Old Faithful Gyser", width = NULL, solidHeader = FALSE, dataTableOutput("dat3"))))

        )
      )
    )
  ))

server <- function(input, output) {

  output$heatmap <- renderPlotly({plot_ly(iris, type = "heatmap")})
  output$dat2 <- renderDataTable({datatable(mtcars,extensions = 'Responsive' )})
  output$dat3 <- renderDataTable({datatable(faithful,rownames = FALSE, options = list(autoWidth = TRUE)  )})

}

shinyApp(ui, server)

Any help please?

RamRS commented 5 years ago

I think this has been addressed here and can be closed.