Open url in shiny with HTML

How to delete the empty space above the "speace2"?
I'm not good at HTML, thank you!

library(shiny)

ui <- fluidPage(
  navbarPage(
    title = HTML("<strong style='color:#000000'>Welcome!</strong>"),
    
    
    navbarMenu("Links",
               tabPanel(
                 a("Google", href="https://google.com", target="_blank")
               )),
    #home
    tabPanel(
      title = HTML("<strong style='font-size:18px'>Home</strong>"), icon = icon("home")),
    tabPanel(
      HTML('<a href="https://www.google.com/" target="_blank"> <strong style="font-size:18px">space2</strong>')
    ),
    
    
    navbarMenu(
      title = HTML("<strong style='font-size:18px'>Tools</strong>"), icon = icon("tools", class = NULL, lib = "font-awesome"),

      tabPanel(HTML("<strong style='font-size:18px'>space1</strong>")),
      
      tabPanel(
        HTML('<a href="https://www.google.com/" target="_blank"> <strong style="font-size:18px">space2</strong>')
      )
    )
  )
)


server <- function(input, output, session) {
  
}

shinyApp(ui, 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.