Changes to text in modules not reflected in app

Hi, I wonder if anyone came across this issue.

I have a modularised dashboard, which has recently started to go a bit awry. Any changes to the text I make within the module, or if I point it to a different Markdown text file, it won't reflect these changes in the app.

For example, in the code below, if I were to change the text in h2("Heading") to for example h2("TEST"), when I run the app, I still see 'Heading', not TEST. Same with changing the path to a different Markdown file one row below.

I assumed it might be some sort of caching issue but have tried others' solutions and nothing worked so far.

Any suggestions would be appreciated.

Thank you,

Martina


ExampleTabUI <- function(id) {

  ns <- NS(id)
  
  tagList(
    fluidRow(
      column(width = 12,
             box(width = 10,
                 h2("Heading"),
                 includeMarkdown("./infoText/generalText/lastReviewedText.rmd")
             ),
             box(width = 2,
                 img(src = "Icon.png", height = "75%", width = "75%")
             )
      )
    ),
    fluidRow(
      column(width = 12,
             box(width = 3,
                 prettyCheckbox(inputId = ns("zoom_axis"),
                                label = strong("Zoom Axis"),
                                shape = "round",
                                value = FALSE
                 )
             )
      )
    ),
    fluidRow(
      column(width = 12,
             box(width = NULL,
                 plotlyOutput(outputId = ns("exampleplot"), height = 600)
             )
      )
    ),
    fluidRow(
      column(width = 12,
             box(width = NULL, 
                 includeMarkdown("./infoText/moduleText/module_sourcesText.rmd")
             )
      )
    )
    
  )
  
}


#---- SERVER -------------------------------------------------------------------------------------------------------------------------------------

ExampleTabServer <- function(id, tabData) {
  moduleServer(
    id,
    function(input, output, session) {
      
      output$exampleplot <- renderPlotly({
        ChartFunction(df = tabData, 
                      screeningtype = "Text", 
                      zoomAxis = input$zoom_axis, 
                      titleAddition = NULL
        )
      })
      
      
    }
  )
}```

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.