application failed to start exit code 1

...this is the code I try to run on the server

library(shiny)

Define UI for application that draws a histogram

ui <- fluidPage(

Application title

titlePanel("Travel Time"),

Sidebar with a slider input for number of bins

sidebarLayout(
sidebarPanel(
sliderInput("D",
"D dikte van de aquifer (m):",
min = 1,
max = 50,
value = 30,
step=1),
sliderInput("P",
"P porositeit:",
min = 0.1,
max = 1,
step = 0.05,
value = 0.3),
sliderInput("N",
"N grondwateraanvulling [m/dag]:",
min = 0.001,
max = 0.01,
step=0.001,
value = 0.003)

),
# Show a plot of the generated distribution
mainPanel(
  plotOutput("myPlot")
)

)
)

Define server logic required to draw a histogram

server <- function(input, output) {

output$myPlot <- renderPlot({
D <- input$D
P <- input$P
N <- input$N

z <- D * seq(0.1, 0.9, 0.1)

t <- P * D / N * log(D / (D - z))
plot(x=t, y=z)

})
}

Run the application

shinyApp(ui = ui, server = server)

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

If you have a query related to it or one of the replies, start a new topic and refer back with a link.