Error in embeding tweet with twitterwidget package,

Hi, I want to embed tweet in my Shiny dashboard. I used twitterwidget package but it does not work. Where I make a mistake? I welcome to your suggestions.

Thanks

library(shiny)
library(tidyverse)
library(dplyr)
library(twitterwidget)

ui <- fluidPage(

fluidRow(
column(
width = 4,
offset = 2,
class = "col-md-6 col-md-offset-0 col-lg-4",
class = "text-center",
tags$h4(HTML(twemoji("2764"), "Tweet")),
withSpinner(twitterwidgetOutput("tweet1",width = "auto", height = "400px"))
))
)

server <- function(input, output) {

    # Obtain tweet ID1
    tweet_id1 <- most_data_liked1%>%
      pull(id)  

       #tweet_id is "1481253751138750470"

    # Render the tweet
    output$tweet1 <- renderTwitterwidget(twitterwidget(tweet_id1) 

}

shinyApp(ui, server)

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.