Thanks Scott, sorry for the delay. here is the example code that demonstrates the issue
library(shiny)
library(ggplot2)
urlinfluencediagnostic <- a("URL Link: Thanks to Bookdown.org for the valuable contribution on Doing Meta-Analysis in R:",
href = "https://bookdown.org/MathiasHarrer/Doing_Meta_Analysis_in_R/heterogeneity.html?q=%20Influence%20Analysis#influence-analysis"
)
ui <- fluidPage(
column(
width = 10,
offset = 1,
align='center',
tags$br(),
HTML("When you click the button, you will get the plot, but then when you click the url Link, the dashboard gets reloaded, the plot goes off "),
tags$br(),
actionButton(inputId = 'mGetMePlot',label = "Get me the Plot"),
plotOutput(outputId = 'mmtcarsPlot',width = '100%',height = '400px'),
tags$br(),
urlinfluencediagnostic
)
)
server <- function(input, output, session) {
data(mtcars, package="datasets")
observeEvent(input$mGetMePlot,{
output$mmtcarsPlot <- renderPlot({
ggplot(mtcars, aes(x=hp, y=mpg, color=cyl )) +
geom_point(size=3)
})
})
}
shinyApp(ui, server)