Shiny 如何重新放置选项卡框';谁的头衔?

Shiny 如何重新放置选项卡框';谁的头衔?,shiny,shinydashboard,Shiny,Shinydashboard,我正在努力重新定位仪表板主体,因为正如我在所附图片中所示,它正在切割tabBox标题的一部分。我尝试使用side=“right”,也尝试使用tags$style(HTML(“.tab content{width:300px}”)并更改width=“n值”,但它不做任何更改。有人知道如何解决这个问题吗?我真的很感激 ui <- dashboardPage( dashboardHeader(title="Deteccao de arvores individuais de LiDAR e

我正在努力重新定位仪表板主体,因为正如我在所附图片中所示,它正在切割tabBox标题的一部分。我尝试使用
side=“right”
,也尝试使用
tags$style(HTML(“.tab content{width:300px}”)
并更改
width=“n值”
,但它不做任何更改。有人知道如何解决这个问题吗?我真的很感激

ui <- dashboardPage(

  dashboardHeader(title="Deteccao de arvores individuais de LiDAR em Shiny App - R", titleWidth = 800),
  dashboardSidebar(tags$style(HTML(".main-sidebar{width: 300px;}")),
    sidebarMenu(
      menuItem("Defina seus parametros e preferencias", icon =icon("dashboard"))),
    conditionalPanel( 
       fileInput('layer', 'Select the CHM.asc file', multiple=FALSE, accept='asc', width = "350px"),
       selectInput("fws", "Select the size of windows to find trees", choices = c("3x3"= (fws<-3), "5x5"= (fws<-5), "7x7"= (fws<-7)), width = "350px"),
       checkboxInput("checkbox", "Would you like to apply the smoothing model for canopy?", value = FALSE, width = "350px"), selectInput("sws", "Select the size of the smoothing window for trees", choices = c("3x3" = (sws<-3), "5x5" = (sws<-5), "7x7"=(sws<-7)), width = "350px"),
       checkboxInput("checkp", "Plot individual trees detected in CHM", value=FALSE, width="350px"),
       checkboxInput("checkpd", "Download the shapefile (.shp) of Individual trees detected", value = FALSE, width = "350px"), uiOutput("shapefile"),
       actionButton("action", "RUN!"))

      ),

  dashboardBody( 
    fluidRow(
      tabBox(title= tagList(shiny::icon("cogs"), "Results"), width = "200px", height = "600px", side = "right",
                tabPanel("Visualization of CHM", plotOutput("mapPlot")),
                tabPanel("Trees detected from rLiDAR", tableOutput("arvlist"), downloadButton("downList", "Download Tree List")),
                tabPanel("Summary of LiDAR metrics", tableOutput("sumy"), downloadButton("downSumy", "Download Summary of LiDAR metrics")),
                tabPanel("Profile of height model", plotOutput("hist"), downloadButton("downHist", "Download Height's Histogram of Density")), #histograma de densidade
                tabPanel("Individual trees detected - Model 2D of CHM", plotOutput("plotTrees"), downloadButton("downDetec", "Download CHM of Trees Detected"))


                 )


    ))
  )

ui改变宽度就可以了

library(shinydashboard)

ui <- dashboardPage(

  dashboardHeader(title="Deteccao de arvores individuais de LiDAR em Shiny App - R", titleWidth = 800),
  dashboardSidebar(tags$style(HTML(".main-sidebar{width: 200px;}")),
                   sidebarMenu(
                     menuItem("Defina seus parametros e preferencias", icon =icon("dashboard"))),
                   conditionalPanel( 
                     fileInput('layer', 'Select the CHM.asc file', multiple=FALSE, accept='asc', width = "350px"),
                     selectInput("fws", "Select the size of windows to find trees", choices = c("3x3"= (fws<-3), "5x5"= (fws<-5), "7x7"= (fws<-7)), width = "350px"),
                     checkboxInput("checkbox", "Would you like to apply the smoothing model for canopy?", value = FALSE, width = "350px"), selectInput("sws", "Select the size of the smoothing window for trees", choices = c("3x3" = (sws<-3), "5x5" = (sws<-5), "7x7"=(sws<-7)), width = "350px"),
                     checkboxInput("checkp", "Plot individual trees detected in CHM", value=FALSE, width="350px"),
                     checkboxInput("checkpd", "Download the shapefile (.shp) of Individual trees detected", value = FALSE, width = "350px"), uiOutput("shapefile"),
                     actionButton("action", "RUN!"))

  ),

  dashboardBody( 
    fluidRow(
      tabBox(title= tagList(shiny::icon("cogs"), "Results"), width = "500px", height = "600px", side = "right",
             tabPanel("Visualization of CHM", plotOutput("mapPlot")),
             tabPanel("Trees detected from rLiDAR", tableOutput("arvlist"), downloadButton("downList", "Download Tree List")),
             tabPanel("Summary of LiDAR metrics", tableOutput("sumy"), downloadButton("downSumy", "Download Summary of LiDAR metrics")),
             tabPanel("Profile of height model", plotOutput("hist"), downloadButton("downHist", "Download Height's Histogram of Density")), #histograma de densidade
             tabPanel("Individual trees detected - Model 2D of CHM", plotOutput("plotTrees"), downloadButton("downDetec", "Download CHM of Trees Detected"))


      )


    ))
)
库(ShinydaShashboard)

ui改变宽度就可以了

library(shinydashboard)

ui <- dashboardPage(

  dashboardHeader(title="Deteccao de arvores individuais de LiDAR em Shiny App - R", titleWidth = 800),
  dashboardSidebar(tags$style(HTML(".main-sidebar{width: 200px;}")),
                   sidebarMenu(
                     menuItem("Defina seus parametros e preferencias", icon =icon("dashboard"))),
                   conditionalPanel( 
                     fileInput('layer', 'Select the CHM.asc file', multiple=FALSE, accept='asc', width = "350px"),
                     selectInput("fws", "Select the size of windows to find trees", choices = c("3x3"= (fws<-3), "5x5"= (fws<-5), "7x7"= (fws<-7)), width = "350px"),
                     checkboxInput("checkbox", "Would you like to apply the smoothing model for canopy?", value = FALSE, width = "350px"), selectInput("sws", "Select the size of the smoothing window for trees", choices = c("3x3" = (sws<-3), "5x5" = (sws<-5), "7x7"=(sws<-7)), width = "350px"),
                     checkboxInput("checkp", "Plot individual trees detected in CHM", value=FALSE, width="350px"),
                     checkboxInput("checkpd", "Download the shapefile (.shp) of Individual trees detected", value = FALSE, width = "350px"), uiOutput("shapefile"),
                     actionButton("action", "RUN!"))

  ),

  dashboardBody( 
    fluidRow(
      tabBox(title= tagList(shiny::icon("cogs"), "Results"), width = "500px", height = "600px", side = "right",
             tabPanel("Visualization of CHM", plotOutput("mapPlot")),
             tabPanel("Trees detected from rLiDAR", tableOutput("arvlist"), downloadButton("downList", "Download Tree List")),
             tabPanel("Summary of LiDAR metrics", tableOutput("sumy"), downloadButton("downSumy", "Download Summary of LiDAR metrics")),
             tabPanel("Profile of height model", plotOutput("hist"), downloadButton("downHist", "Download Height's Histogram of Density")), #histograma de densidade
             tabPanel("Individual trees detected - Model 2D of CHM", plotOutput("plotTrees"), downloadButton("downDetec", "Download CHM of Trees Detected"))


      )


    ))
)
库(ShinydaShashboard)

ui尝试减小
选项卡框的宽度。您的
选项卡框的宽度似乎太大,无法装入仪表板主体。嘿@SBista!我试着这么做,但似乎出于某种原因,我不知道,应用程序中的宽度没有改变,即使我在修改ui.R中的值。你知道为什么吗?谢谢尝试减小
选项卡框的宽度。您的
选项卡框的宽度似乎太大,无法装入仪表板主体。嘿@SBista!我试着这么做,但似乎出于某种原因,我不知道,应用程序中的宽度没有改变,即使我在修改ui.R中的值。你知道为什么吗?谢谢