Error : tags$iframe() "(Site Name) Refused to Connect."


library(shiny)
members <- data.frame(name=c("Name 1", "Name 2", "Name 3", "Name 4"), nr=c('ryo-en', 'ryo-cn', 'ryo-tw', 'ryo-jp'))

ui <- fluidPage(titlePanel("Getting Iframe"), 
                sidebarLayout(
                  sidebarPanel(
                    fluidRow(
                      column(6, selectInput("Member", label = h5("Choose a option"), choices = c('ryo-en', 'ryo-cn', 'ryo-tw', 'ryo-jp'))
                      ))),
                  mainPanel(fluidRow(
                    htmlOutput("frame")
                  )
                  )
                ))

server <- function(input, output) {
  observe({ 
    query <- members[which(members$nr==input$Member),2]
    lnk <<- paste0("https://rpubs.com/englianhu/",query)
  })
  output$frame <- renderUI({
    input$Member
    ui_lnk <- tags$iframe(src=lnk, height=600, width=535, frameborder = "no")
    print(ui_lnk)
    ui_lnk
  })
}

shinyApp(ui, server)

Noticed the error shows above.


and then whats wrong with the logo states RPubs by RStudio since using rstudio packages, embed rpubs link to post on shiny...


References

Citation : Error: embed sidebar & css background inside html file doesn't work (shiny) · Issue #2 · scibrokes/owner · GitHub

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.