how to bold text and include paragraphs

Hey there,

I am struggling to a) make text bold and b) to create paragraphs in text in my shiny app.
I tried a couple solutions suggested but none would work for me.

The goal is to bold and to structure text with paragraphs in p("")

Thanks a lot!

library(shiny)


    ui <- (htmlOutput("page"))
    
    intro <- function(...) {
        div(class = 'container', id = "intro",
            div(class = 'col-sm-2'),
            div(class = 'col-sm-8',
                h1("Startseite"),
                p("Sehr geehrte Teilnehmerin / sehr geehrter Teilnehmer, bitte bestaetigen Sie auf der folgenden Seite Ihre Einwilligung zur Teilnahme an dieser Untersuchung. Die Teilnahme wird etwa 30 Minuten in Anspruch nehmen. Unter den Teilnehmern werden Amazon-Gutscheine im Wert von 150 Euro verlost. Wenn Sie an der Verlosung teilnehmen moechten, hinterlassen Sie bitte im Anschluss an die Untersuchung Ihre E-Mail-Adresse."),
                br(),
                actionButton("W1", "Weiter")
            ))
        
    }
    
    render_page <- function(...,f, title = "Test") {
        page <- f(...)
        renderUI({
            fluidPage(page, title = title)
        })
    }
   

server <- function(input, output) {
    output$page <- render_page(f = intro)
    

}


shinyApp(ui = ui, server = server)

I am certainly not a Shiny expert but this is one way make a couple of bold words and break up the paragraph. Is this the sort of thing you want to do?

intro <- function(...) {
  div(class = 'container', id = "intro",
      div(class = 'col-sm-2'),
      div(class = 'col-sm-8',
          h1("Startseite"),
          span("Sehr geehrte"), strong("Teilnehmerin"), span(" / sehr geehrter"), 
          strong("Teilnehmer,"), 
          span("bitte bestaetigen Sie auf der folgenden Seite Ihre Einwilligung zur Teilnahme an dieser Untersuchung."),
          p("Die Teilnahme wird etwa 30 Minuten in Anspruch nehmen. Unter den Teilnehmern werden Amazon-Gutscheine im Wert von 150 Euro verlost. Wenn Sie an der Verlosung teilnehmen moechten, hinterlassen Sie bitte im Anschluss an die Untersuchung Ihre E-Mail-Adresse."),
          br(),
          actionButton("W1", "Weiter")
      ))
  
}
1 Like

Yes, works perfectly thanks a lot! :slight_smile:

This topic was automatically closed 7 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.