Remove white space between plot

I have a simple app below that has 3 charts in a row. There is a lot of white space between and around the chart. See the red boxes of the image. How can that space be reduced so it can be used for the charts? I tried using style and setting padding and margin to 0 but that did not work.

How can you also reduce the green space in the image?

Thank you!!

Thank you.

ui = navbarPage("header1",
tabPanel("header2",
fluidRow(
column(2, wellPanel(
dateInput("Date", "Select a Date", value = "2005-01-01"))
),
column(10, tabsetPanel(type = "tabs",
tabPanel("Tab1",
column(10,
column(width = 3,plotly::plotlyOutput("plot1")%>% layout( title = "",
xaxis=list(title=""),
yaxis=list(title="")
)
),
column(width = 3,plotly::plotlyOutput("plot2")%>% layout( title = "",
xaxis=list(title=""),
yaxis=list(title=""))
),
column(width = 3,plotly::plotlyOutput("plot3")%>% layout( title = "",
xaxis=list(title=""),
yaxis=list(title=""))
)
)
)

                  )
                  
                  )
                )
       )
  )
  
  
  server = shinyServer(function(input, output) {
    
    output$plot1 = renderPlotly({
      plotly::plot_ly(data.frame(x = 1:3, y = 1:3), x = ~x, y =~y, type = 'bar') 
    })
    
    output$plot2 = renderPlotly({
      plotly::plot_ly(data.frame(x = 1:3, y = 1:3), x = ~x, y =~y, type = 'bar') 
    })
    
    output$plot3 = renderPlotly({
      plotly::plot_ly(data.frame(x = 1:3, y = 1:3), x = ~x, y =~y, type = 'bar') 
    })

  })
  
  shinyApp(ui = ui, server = server)

In Bootstrap's grid system there are max. 12 columns, this however isn't global - it applies to each nested "sub-column". Please check the following:

library(shiny)
library(plotly)

ui = navbarPage("header1",
                tabPanel("header2",
                         fluidRow(
                           column(2, wellPanel(
                             dateInput("Date", "Select a Date", value = "2005-01-01"))
                           ),
                           column(10, tabsetPanel(type = "tabs",
                                                  tabPanel("Tab1",
                                                                  column(width = 4,plotly::plotlyOutput("plot1")%>% layout( title = "",
                                                                                                                            xaxis=list(title=""),
                                                                                                                            yaxis=list(title="")
                                                                  )
                                                                  ),
                                                                  column(width = 4,plotly::plotlyOutput("plot2")%>% layout( title = "",
                                                                                                                            xaxis=list(title=""),
                                                                                                                            yaxis=list(title=""))
                                                                  ),
                                                                  column(width = 4,plotly::plotlyOutput("plot3")%>% layout( title = "",
                                                                                                                            xaxis=list(title=""),
                                                                                                                            yaxis=list(title=""))
                                                                  )
                                                  )
                                                  
                           )
                           
                           )
                         )
                )
)


server = shinyServer(function(input, output) {
  
  output$plot1 = renderPlotly({
    plotly::plot_ly(data.frame(x = 1:3, y = 1:3), x = ~x, y =~y, type = 'bar') 
  })
  
  output$plot2 = renderPlotly({
    plotly::plot_ly(data.frame(x = 1:3, y = 1:3), x = ~x, y =~y, type = 'bar') 
  })
  
  output$plot3 = renderPlotly({
    plotly::plot_ly(data.frame(x = 1:3, y = 1:3), x = ~x, y =~y, type = 'bar') 
  })
  
})

shinyApp(ui, server)

Please see shiny's layout guide for further information:

https://shiny.rstudio.com/articles/layout-guide.html