Choose one of the New York Times APIs, construct an interface in R to read in the JSON data, and transform it to an R dataframe.
Loading required packages
library(jsonlite)
library(tidyverse)
library(DT)
library(tm)
library(wordcloud)
library(SnowballC)
library(RColorBrewer)url <- "https://api.nytimes.com/svc/movies/v2/reviews/all.json?order=by-opening-date&api-key= PEZd0NEB405hUkS4ym6cBBB81CauknUu"
df <- fromJSON(url,simplifyDataFrame = TRUE)
datatable(df$results)df1 <- df$results %>%
select(display_title,byline,headline,summary_short)
datatable(df1)Corpus<- Corpus(VectorSource(df1$summary_short))
Corpus<- tm_map(Corpus, content_transformer(tolower))
Corpus<- tm_map(Corpus, removeWords, stopwords())
Corpus<- tm_map(Corpus, stripWhitespace)
wordcloud(Corpus, min.freq = 2, colors = brewer.pal(8,"Set2"),random.order = FALSE, rot.per = .1)