避免不必要的細節
在實踐中,閃亮的應用程式通常非常複雜,並且具有隨著時間的推移而開發的功能。通常,這些額外的細節不是重現你的問題所必需的。最好是在編寫 MCVE 時跳過這些細節。
錯誤
為什麼我的情節沒有顯示?
library(shiny)
library(ggplot2)
ui <- fluidPage(
plotOutput('plot')
)
server <- function(input, output, session){
df <- data.frame(treatment = rep(letters[1:3], times = 3),
context = rep(LETTERS[1:3], each = 3),
effect = runif(9,0,1))
df$treat.con <- paste(df$treatment,df$context, sep = ".")
df$treat.con <- reorder(df$treat.con, -df$effect, )
output$plot = renderPlot({
myPlot <- ggplot(df, aes(x = treat.con, y = effect)) +
geom_point() +
facet_wrap(~context,
scales = "free_x",
ncol = 1)
})
}
shinyApp(ui, server)
對
為什麼我的 Plot 沒有顯示?
library(shiny)
library(ggplot2)
ui <- fluidPage(
plotOutput('plot')
)
server <- function(input, output, session){
output$plot = renderPlot({
myPlot <- ggplot(mtcars, aes(mpg, wt)) + geom_point()
})
}
shinyApp(ui, server)