Change shiny selectizeInput class to look like normal text

HI,

I want to have select input in text and looking like normal text, only after someone click on it should give an onption to select some value.

ui <- fluidPage(
    br(),
    tags$style("#select1{background-color: transparent; border: 0; box-shadow: none;}"),
    tags$div(HTML("just a normal text")),
    selectInput("select1","", c("test1", "test2"), selected = c("test1"), 
                selectize = TRUE, multiple = FALSE),
    HTML("just a normal text 2")
  )

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

shinyApp(ui, server)

should look like normal text "just a normal text test1 just a normal text 2".
I just want to have some page title with reactive key-words.

is there some css wizard?

Regards