Moving objects in shiny UI

I apologize, but I just haven't been able to find something on this that makes sense to me. This is currently stacking on top of each other, but I want the key to be out on the right side of the page with additional text underneath it. I tried messing around with a column layout and a row layout and haven't had success either way. Below the text in the code I included is just two plots.

tabItem(tabName = "teamstats",
            fluidPage(
              h2("Team Overview"),
              h3("Key")
              selectizeInput("Team", "Select Team:", TONEFF),
              plotOutput("OwnFF"),
              plotOutput("OppFF"))

Hi,

Your description is a bit vague when it comes to the layout, and since you only provide a snippet of code it's tricky to deduce what you like. You should consider making a small Shiny Reprex next time. Shiny debugging and reprex guide

Anyway, here is my interpretation of your questions, and I did just use rows and columns

library(shiny)

ui <- fluidPage(
  fluidRow(
    column(8, 
           h2("Team Overview"),
           selectizeInput("Team", "Select Team:", 5:8),
           plotOutput("OwnFF"),
           plotOutput("OppFF")
           ),
    column(4, h3("Key"), "mroe text....")
  )
)

server <- function(input, output, session) {
  output$OwnFF = renderPlot(
    plot(1:input$Team)
  )
  
  output$OppFF = renderPlot(
    plot(runif(input$Team))
  )
}

shinyApp(ui, server)

Created on 2021-12-14 by the reprex package (v2.0.1)

If this is not what you want, create a better description and code using the guide linked above.

Hope this helps,
PJ

Really apprecaite the feedback and apologize for not having more there. This is what I am trying to run, but get an error when I run my body <- dashboardBody()

Error in lapply(list(...), tagAssert, class = "tab-pane") :
argument is missing, with no default

I don't understand the error as I think I have the tab defined

sidebar <- dashboardSidebar(
    sidebarMenu(
      menuItem("Home", tabName = "home", icon = icon("home")),
      menuItem("Player Stats", tabName = "playerstats", icon = icon("address-book")),
      menuItem("Four Factors", tabName = "teamstats", icon = icon("users")),
      menuItem("On/Off", tabName = "OnOff", icon = icon("strava"))
    )
  )
body <- dashboardBody(
    tabItems(
      tabItem(tabName = "home",
            fluidPage(
              h2("Welcome to HoopR"))
    ),
      tabItem(tabName = "playerstats",
            fluidPage(
              h2("Player Stats"),
              DT::dataTableOutput("PlayerStats"))
    ),
      tabItem(tabName = "teamstats",
            fluidPage(
          fluidRow(
            column(8,
            h2("Team Overview"),
            selectizeInput("Team", "Select Team:", TONEFF),
            plotOutput("OwnFF"),
            plotOutput("OppFF")
                      ),
            column(4, h3("Key"), "More text")))
    ),
      tabItem(tabName = "OnOff",
              fluidPage(
                h2("On/Off Splits"))
    ),
  )
)

HoopR <- dashboardPage(header, sidebar, body)

server <- function(input, output) {
  output$PlayerStats = DT::renderDataTable(
    PlayerStats)
  output$OwnFF <- renderPlot({
    TONEFFown %>%
      dplyr::filter(Team == input$Team | Team == "NCAA Average") %>%
      ggplot(.,aes(x=question,y=response, color=Team)) + labs(title="Offensive Overview", x=input$Team, y="Four Factors") + geom_point() 
  })  
  output$OppFF <- renderPlot({
    TONEFFopp %>%
      dplyr::filter(Team == input$Team | Team == "NCAA Average") %>%
      ggplot(.,aes(x=question,y=response, color=Team)) + labs(title="Defensive Overview", x=input$Team, y="Four Factors") + geom_point() 
  })
}
  
shinyApp(ui = HoopR, server = server)

If you read your body assignment from the bottom up, you will see that there is a comma that spoils the code.

    ),
  )
)

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.