After conducting the research on Netflix’s recommender system a few weeks ago, I was intrigued by how they used the the algorithm and predicted the rise of Netflix Originals such as House of Cards. From the perspective of a marketer, I have two main motivations to conduct the sentimental analysis because it provides a in depth look into consumer’s attitudes towards the product (House of Cards) and whether it will contimue lead the trend.
To determine the quality of a movie, I’ll conduct Twitter Sentimental Analysis then compare with the usuer’s reviews on IMDb (Internet Movie Databse) since it has over 45 million registered users and serves as the biggest online movie databses.
Step 1: Search Twitter for “” and collect tweet text, scrape IMDb for user reviews
Step 2: Load sentiment word lists and Get the scored sentiment for each source
Step 3: Clean, transform and analyze the data sets
Step 4: Compare Twitter sentiment with Datumbox API key
Step 5: Compare Twitter sentiment analysis with IMDb ratings
Step 6: Conclusion
For this project, the following data sources were used via scarping web pages, web API’s and downloads of CSV files.
https://dev.twitter.com/overview/api
www.datumbox.com/apikeys/
http://www.imdb.com/title/tt1856010/reviews?filter=best;filter=best;start= http://www.imdb.com/title/tt1856010/reviews?filter=prolific;filter=prolific;start="
For reference, I downloaded two files “positive words. txt” and " negative words. txt" from https://www.cs.uic.edu/~liub/FBS/sentiment-analysis.html (“Opinion Mining, Sentiment Analysis, and Opinion Spam Detection”). I alos write .csv file and dump in MySQL
a.One data transfomrtaion operation (wife to long, columns to data format)
I used “dplyr” and “tidyr” to reshape and clean up the my raw data and dump into MySQL
b.One statistical Analysis and one graphic to describe or validate my data and conclusion(s)
Twitter Sentimental Analysis : NLP, Datumbox APIs, Sentiment,ThinkToStartR, WordCloud, ggplot2 IMDb User Reviews : Sentiment, Naive Bayes Classifiers, SVM, MAXENT, Predictive Analysis, ggplot2
c.One feature that we did not cover in class
I work with Twitter APIs and Datumbox APIs, and perfrom sentimental analysis on IMDb user reviews.
library(twitteR)
library(plyr)
##
## Attaching package: 'plyr'
## The following object is masked from 'package:twitteR':
##
## id
library(stringr)
library(syuzhet)
library(lubridate)
##
## Attaching package: 'lubridate'
## The following object is masked from 'package:plyr':
##
## here
## The following object is masked from 'package:base':
##
## date
library(ggplot2)
library(scales)
##
## Attaching package: 'scales'
## The following object is masked from 'package:syuzhet':
##
## rescale
library(reshape2)
library(dplyr )
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:lubridate':
##
## intersect, setdiff, union
## The following objects are masked from 'package:plyr':
##
## arrange, count, desc, failwith, id, mutate, rename, summarise,
## summarize
## The following objects are masked from 'package:twitteR':
##
## id, location
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(tidyr)
##
## Attaching package: 'tidyr'
## The following object is masked from 'package:reshape2':
##
## smiths
library(ThinkToStartR)
## Loading required package: Rfacebook
## Loading required package: httr
## Loading required package: rjson
## Loading required package: httpuv
##
## Attaching package: 'Rfacebook'
## The following object is masked from 'package:twitteR':
##
## updateStatus
## The following object is masked from 'package:methods':
##
## getGroup
## Loading required package: RCurl
## Loading required package: bitops
##
## Attaching package: 'RCurl'
## The following object is masked from 'package:tidyr':
##
## complete
## Loading required package: RJSONIO
##
## Attaching package: 'RJSONIO'
## The following objects are masked from 'package:rjson':
##
## fromJSON, toJSON
## Loading required package: tm
## Loading required package: NLP
##
## Attaching package: 'NLP'
## The following object is masked from 'package:httr':
##
## content
## The following object is masked from 'package:ggplot2':
##
## annotate
## Loading required package: wordcloud
## Loading required package: RColorBrewer
## Warning: replacing previous import 'Rfacebook::updateStatus' by
## 'twitteR::updateStatus' when loading 'ThinkToStartR'
library(plyr)
library(RCurl)
library(wordcloud)
#set up twitter APIs
consumer_key <- "yGfMZdr02SidVYVTiul5YdJIh"
consumer_secret <- "ZxTcNmfJQ2cxLlykvYbZFFn0upknNVkpmdxAiGRDCZwIFN8wkH"
token <- "3192371979-CPwxqkws80IXLReSe1yMYl9QWEzCSEIv37lnPlZ"
token_secret <- "ZFeXPlFmA8hsDs6dCAeR4E909lIkfcSjUFGLQ3jGlmwo4" #Access token secret
setup_twitter_oauth(consumer_key, consumer_secret, token, token_secret)
## [1] "Using direct authentication"
#Get tweets about "House of Cards", due to the limitation, we'll set n=3000
netflix.tweets<- searchTwitter("#HouseofCards",n=3000,lang="en")
## Warning in doRppAPICall("search/tweets", n, params = params,
## retryOnRateLimit = retryOnRateLimit, : 3000 tweets were requested but the
## API can only return 2247
tweet=netflix.tweets[[1]]
tweet$getScreenName()
## [1] "JossaDosBichos"
tweet$getText()
## [1] "RT @FUNDERWOODHOC: Revenge is below me. But \"Accidents\" will happen ~ F.U. #FrankUnderwood #HouseofCards https://t.co/WWDKaqvFzz"
netflix.text=laply(netflix.tweets,function(t)t$getText())
length(netflix.text)
## [1] 2247
head(netflix.text)
## [1] "RT @FUNDERWOODHOC: Revenge is below me. But \"Accidents\" will happen ~ F.U. #FrankUnderwood #HouseofCards https://t.co/WWDKaqvFzz"
## [2] "RT @FUNDERWOODHOC: Revenge is below me. But \"Accidents\" will happen ~ F.U. #FrankUnderwood #HouseofCards https://t.co/WWDKaqvFzz"
## [3] "Uber may turn out to be a bigger corporate fraud than Enron or Madoff #HouseOfCards \nhttps://t.co/QMi3pIeLVF"
## [4] "RT @FUNDERWOODHOC: Revenge is below me. But \"Accidents\" will happen ~ F.U. #FrankUnderwood #HouseofCards https://t.co/WWDKaqvFzz"
## [5] "RT @FUNDERWOODHOC: Revenge is below me. But \"Accidents\" will happen ~ F.U. #FrankUnderwood #HouseofCards https://t.co/WWDKaqvFzz"
## [6] "RT @FUNDERWOODHOC: Revenge is below me. But \"Accidents\" will happen ~ F.U. #FrankUnderwood #HouseofCards https://t.co/WWDKaqvFzz"
#performing data cleaning and store in csv.file
netflix.text = gsub("(RT|via)((?:\\b\\W*@\\w+)+)", "", netflix.text)
netflix.text = gsub("@\\w+", "", netflix.text)
netflix.text = gsub("[[:punct:]]", "", netflix.text)
netflix.text = gsub("[[:digit:]]", "", netflix.text)
netflix.text = gsub("http\\w+", "", netflix.text)
netflix.text = gsub("[ \t]{2,}", "", netflix.text)
netflix.text = gsub("^\\s+|\\s+$", "", netflix.text)
netflix.text <- str_replace_all(netflix.text," "," ")
netflix.text <- str_replace_all(netflix.text,"#[a-z,A-Z]*","")
netflix.text <- str_replace_all(netflix.text,"@[a-z,A-Z]*","")
netflix.text <- tolower(netflix.text)
head(netflix.text)
## [1] "revenge is below me but accidents will happenfu frankunderwood houseofcards"
## [2] "revenge is below me but accidents will happenfu frankunderwood houseofcards"
## [3] "uber may turn out to be a bigger corporate fraud than enron or madoff houseofcards"
## [4] "revenge is below me but accidents will happenfu frankunderwood houseofcards"
## [5] "revenge is below me but accidents will happenfu frankunderwood houseofcards"
## [6] "revenge is below me but accidents will happenfu frankunderwood houseofcards"
write(netflix.text, "HouseofCards_Tweets.csv",ncolumn=1)
#perform sentimental analysis
sentiment <- get_nrc_sentiment(netflix.text)
head(sentiment)
## anger anticipation disgust fear joy sadness surprise trust negative
## 1 1 1 0 1 0 0 1 0 1
## 2 1 1 0 1 0 0 1 0 1
## 3 1 0 0 0 0 0 0 0 1
## 4 1 1 0 1 0 0 1 0 1
## 5 1 1 0 1 0 0 1 0 1
## 6 1 1 0 1 0 0 1 0 1
## positive
## 1 0
## 2 0
## 3 0
## 4 0
## 5 0
## 6 0
#perform data transformation and add the sentimental analysis into tweets
netflix.text <- cbind(netflix.text, sentiment)
head(netflix.text)
## netflix.text
## 1 revenge is below me but accidents will happenfu frankunderwood houseofcards
## 2 revenge is below me but accidents will happenfu frankunderwood houseofcards
## 3 uber may turn out to be a bigger corporate fraud than enron or madoff houseofcards
## 4 revenge is below me but accidents will happenfu frankunderwood houseofcards
## 5 revenge is below me but accidents will happenfu frankunderwood houseofcards
## 6 revenge is below me but accidents will happenfu frankunderwood houseofcards
## anger anticipation disgust fear joy sadness surprise trust negative
## 1 1 1 0 1 0 0 1 0 1
## 2 1 1 0 1 0 0 1 0 1
## 3 1 0 0 0 0 0 0 0 1
## 4 1 1 0 1 0 0 1 0 1
## 5 1 1 0 1 0 0 1 0 1
## 6 1 1 0 1 0 0 1 0 1
## positive
## 1 0
## 2 0
## 3 0
## 4 0
## 5 0
## 6 0
Use ggplot2 to visualize the finding
Datumbox offers more detailed sentiment analysis for tweets, and thanks to Julian Hillebrand, he has created a new package which contained the sentiment analyaiss on Twitter with Datumbox Key and wordcloud. The result shows that most of the tweets are neutral which matches with the sentimental analysis based on the positive and negative.txt from Hu and Liu.
#use the graphic to present the findings
#set up y = count
Totals<- data.frame(colSums(netflix.text[,c(11:10)]))
names(Totals) <- "score"
#set up x = sentiment
Totals <- cbind("sentiment" = rownames(Totals), Totals)
rownames(Totals) <- NULL
ggplot(Totals, aes(x = sentiment, y = score)) +
geom_bar(aes(fill = sentiment), stat = "identity", position = "dodge", width = 1) +
xlab("sentiment") + ylab("sentiment Scores") + ggtitle("Sentiment Scores for All Tweets")
##Sentimental Analysis with Datumbox API
#set up twitter APIs
consumer_key <- "yGfMZdr02SidVYVTiul5YdJIh"
consumer_secret <- "ZxTcNmfJQ2cxLlykvYbZFFn0upknNVkpmdxAiGRDCZwIFN8wkH"
token <- "3192371979-CPwxqkws80IXLReSe1yMYl9QWEzCSEIv37lnPlZ"
token_secret <- "ZFeXPlFmA8hsDs6dCAeR4E909lIkfcSjUFGLQ3jGlmwo4" #Access token secret
setup_twitter_oauth(consumer_key, consumer_secret, token, token_secret)
## [1] "Using direct authentication"
ThinkToStart("setup_twitter_oauth",api_key="yGfMZdr02SidVYVTiul5YdJIh",api_secret="ZxTcNmfJQ2cxLlykvYbZFFn0upknNVkpmdxAiGRDCZwIFN8wkH")
## [1] "No function defined"
ThinkToStart("SentimentCloud","#HouseofCards",30,"2c2aab873c34498ba6624bfdf0cf2faf")
##
## ...Packages were already installed!
##
## ...Packages were already loaded!
## [1] "Getting tweets..."
## [1] "Getting sentiments..."
## [1] "1 of 30"
## [1] "2 of 30"
## [1] "3 of 30"
## [1] "4 of 30"
## [1] "5 of 30"
## [1] "6 of 30"
## [1] "7 of 30"
## [1] "8 of 30"
## [1] "9 of 30"
## [1] "10 of 30"
## [1] "11 of 30"
## [1] "12 of 30"
## [1] "13 of 30"
## [1] "14 of 30"
## [1] "15 of 30"
## [1] "16 of 30"
## [1] "17 of 30"
## [1] "18 of 30"
## [1] "19 of 30"
## [1] "20 of 30"
## [1] "21 of 30"
## [1] "22 of 30"
## [1] "23 of 30"
## [1] "24 of 30"
## [1] "25 of 30"
## [1] "26 of 30"
## [1] "27 of 30"
## [1] "28 of 30"
## [1] "29 of 30"
## [1] "30 of 30"
library(twitteR)
library(stringr)
library(syuzhet)
library(lubridate)
library(ggplot2)
library(scales)
library(reshape2)
library(dplyr)
library(tidyr)
library(plyr)
library(ThinkToStartR)
library(RCurl)
library(wordcloud)
library(rvest)
## Loading required package: xml2
library(XML)
##
## Attaching package: 'XML'
## The following object is masked from 'package:rvest':
##
## xml
library(tm)
library(RTextTools)
## Loading required package: SparseM
##
## Attaching package: 'SparseM'
## The following object is masked from 'package:base':
##
## backsolve
library(e1071)
#retrieve top reviews from best reviews and prolific authors on IMDb.com
counts = c(0,10,20,30,40,50,60,70,80,90,100)
reviews = NULL
for (j in counts){
page1 = read_html(paste0("http://www.imdb.com/title/tt1856010/reviews?filter=best;filter=best;start=",j))
page2 = read_html(paste0("http://www.imdb.com/title/tt1856010/reviews?filter=prolific;filter=prolific;start=",j))
reviews1 <- page1 %>% html_nodes("#tn15content") %>%
html_nodes("div+p") %>%
html_text()
reviews2 <- page2 %>% html_nodes("#tn15content") %>%
html_nodes("div+p") %>%
html_text()
best.reviews = setdiff(reviews1, c("*** This review may contain spoilers ***"))
prolific.authors = setdiff(reviews2, c("*** This review may contain spoilers ***"))
reviews <- c(reviews,best.reviews,prolific.authors)
reviews <- gsub("\r?\n|\r", " ", reviews)
reviews <- tolower(gsub("[^[:alnum:] ]", " ", reviews))
reviews <- gsub("<.*?>", " ", reviews)
reviews <- iconv(reviews, "latin1", "ASCII", sub="")
reviews <- removeNumbers(reviews)
reviews <- stripWhitespace(reviews)
reviews <- gsub("^\\s+|\\s+$", "", reviews)
}
IMDbsentiment <- cbind(get_nrc_sentiment(reviews), reviews)
#Convert the list to a data frame then convert to a tbl_df format
clean.reviews = data.frame(text = reviews,class = get_nrc_sentiment(reviews), stringsAsFactors = T)
str(clean.reviews)
## 'data.frame': 142 obs. of 11 variables:
## $ text : Factor w/ 129 levels "after finishing damages i hadn t found another mesmerizing drama with a top notch cast that filled it s shoes until this superb"| __truncated__,..: 39 126 12 73 61 19 48 3 84 125 ...
## $ class.anger : num 5 2 7 0 9 2 4 2 1 3 ...
## $ class.anticipation: num 12 5 10 2 12 4 14 2 3 9 ...
## $ class.disgust : num 2 2 1 1 5 0 4 2 0 2 ...
## $ class.fear : num 6 2 6 1 9 2 6 1 0 7 ...
## $ class.joy : num 7 2 10 2 8 2 8 4 3 5 ...
## $ class.sadness : num 2 1 5 2 9 1 5 1 2 3 ...
## $ class.surprise : num 3 1 8 0 8 1 3 2 2 5 ...
## $ class.trust : num 13 2 14 2 15 1 18 5 6 10 ...
## $ class.negative : num 11 3 11 3 16 5 13 2 2 4 ...
## $ class.positive : num 24 3 24 5 24 8 36 5 5 11 ...
clean = as.data.frame(clean.reviews)
head(clean)
## text
## 1 i firmly believe that one of the major aspects of what makes house of cards so good is the ability to watch all the episodes back to back with no commercials or programming schedules to get in the way this small but hugely significant idea will be an industry game changer and i am certain that this is just the beginningto me the biggest advantage that this idea contributes to house of cards is that it frees up significant time during episodes because it makes things like flashbacks or repeats of events almost completely redundant there s simply no need for them because everything is so fresh in your mind which leaves all that extra time for more story more action more conspiracy more drama more of the stuff that viewers really want to see however it must be said that it does take a few episodes to get used to this and you have to be really switched on and completely focused to ensure you don t miss a beat because you really will pay a price if you do because what s said is never repeated only referenced further down the trackas for the show itself i can t sum it up any better than by saying it s incredibly good to watch the one aspect of the show i enjoy the most is the monologue or removal of the fourth wall between the viewer and underwood it s an incredibly effective method of storytelling as well as the expression of emotion or opinion and kevin spacey does a superb job at pulling it off along with every other aspect of his complex and intriguing character the quality of writing directing and storytelling is as good as you ll ever see on the best shows in the world right now underwood has a massive ship to steer and it is fascinating watching how he does it through manipulation blackmail greed and determination each and every character has a critical role to play there s no characters you could cast aside as being irrelevant or unnecessary to the story that is a very difficult feat to achieve and house of cards easily passes that testif you re going to pioneer something like netflix have with how viewers can watch house of cards you have to do it well everything has to be perfect otherwise it will flop a top quality show in house of cards coupled with the worlds best internet streaming service is a very very good place to start netflix and the house of cards team deserve a huge round of applause for daring to go places where no one has gone before the million gamble has definitely paid off and i cannot wait for moreneedless to say house of cards earns a rating and an absolute must watch from me
## 2 when i thought about francis urquhart of the original house of cards series i could not help but imagine kevin spacey in a way that was similar but a role of his own making spacey s role of francis underwood in netflix s original series is nothing short of a tour de force the convenience of being able to watch the whole season right away is also something to mention as a new fresh and exciting method of television excellence no longer do we have to wait and be fed slowly the episodes as we wonder what might happen and find ourselves somewhat disappointed now we can be swept away and that s exactly what will happen to you when you sit down to watch this
## 3 fans of david fincher and kevin spacey have been eagerly looking forward to house of cards not only is this an opportunity to see an elite hollywood director and actor take on a new medium but it represents netflix s first attempt at original programming i guess lilyhammer came first but house of cards is a much bigger investment for netflix the ceo of netflix has said that house of cards is meant to be a show on the quality level of the top cable stations such as hbo and the final product delivers on this promise house of cards follows several characters involved in the political scene in washington d c including politicians of various rank and influence kevin spacey is a house majority whip in the house of representatives and an upcoming reporter played brilliantly by kate mara who you may recognize from the first season of american horror story the cast in uniformly excellent and thrives under fincher s direction occasionally kevin spacey s character will talk directly to the camera and offer some narration which is the only area where the show stumbles but it isn t too distracting speaking of fincher s direction it shouldn t come as any surprise to know that house of cards looks great the atmosphere is moody and resembles a tone somewhere between the game and the social network the music is equally good complementing the mood of the show without becoming overbearing being a political drama one could be understandably weary of taking the plunge into a episode season if they don t find politics interesting but that shouldn t be a concern the writing is sharp engaging and clear and the characters are interesting and well developed the editing helps it is tight and keeps the plot moving briskly making the political intrigue both exciting and easy to follow netflix has really created something impressive with house of cards when hearing that an online streaming service was creating an original show some may have been concerned that it would be cheap looking and generally not on par with what amc fx showtime and hbo are offering well netflix got some talented people and gave them the money to make something good and the product speaks for itself house of cards comes highly recommended
## 4 just watched the first episode it is outstanding in every sense of the word fist of all i d like to say kevin spacey is amazing he s not the dull politician we re used to seeing he s a deeply written character with nuances to his actions and speaking you can definitely see fincher s style in the first episode at least it contains some of the similar themes he has tackled before in his film and adds to those he crafts the story very tightly woven and complex kate mara is also great she adds to the list of modern fincher characters i love the points of satire in spacey s character and some of the symbolism used the show is outstanding in every aspect unlike a lot of other political dramas on tv can t wait to watch the next episodes definitely a must watch for any fan of tv or fincher or anyone interested in this
## 5 i was so looking forward to this having been a big fan of the original bbc series with its masterful central performance by ian richardson in fact when i logged in to netflix like a lot of people this show is my sign up moment i realised that my expectation level was really high within the first seconds kevin spacey s character frank underwood has killed something in this case dispatching an unfortunate dog which has been hit by a hit and run driver and as the political intrigue starts to develop around him spacey just fills the screen by the end of the first episode it isn t so much that you have forgotten ian richardson as urqhuart underwood s british cousin but realised that spacey is taking us somewhere different with francis urqhuart you got the impression he was always a psychopath waiting for the trigger to start his macchiavellian and murderous rise underwood seems to be just a more clever more ruthless and less hypocritical politician than those around him the fundamentals of the show the scorned and bitter political back room fixer the lady macbeth figure of francis wife the ambitious young woman journalist but all updated mrs underwood is no tory wife waiting in the country while her husband charts his rise to power she is the one giving him the backbone to do it and as we see her brutally wielding the axe at the charity in which she works it becomes clear she is no slouch in the ruthlessness stakes herself the character of zoe barnes the young reporter is in a lot of ways more rounded than matty storin in the british version here she is ballsy ambitious and a bit ruthless herself while she retains the innocence of the character she gives the impression she thinks she knows what she is doing which will make later episodes much more juicy as she realises she is way over her head the show is shot beautifully as you d expect from the calibre of the team behind it and the production values are excellent supporting roles are great it looks like a movie or the west wing before they ran out of money but the undisputed joy of this series is spacey who is a more world weary more cynical francis and who is setting about his task of revenge and ambition much like he destroyed the unlucky dog at the start of episode its an unpleasant task but someone has to do it spacey is every bit as good as ian richardson in this show and netflix s big gamble deserves to pay off
## 6 from the start kevin spacey captivates impresses with his his portrayal as the machiavellian chief whip the dialogue is superb the editing tight the plot moves at just the right pace i m episodes in at the moment so far it hasn t missed a beat i remember the original house of cards on the bbc in the early s at first hearing there would be a us remake had some concerns how would they ever match up to the quality acting would they still do the jacobean theatre style breaking of the th wall speaking directly to the audience i needn t have worried kevin spacey handles the role with aplomb although ian richardson originally had a hint of a twinkle in his eye when about to pull peoples strings kevin spacey is far more emotionless cold blooded menacing both work equally for the part launching on netflix was a brave move i really appreciate being able to binge on episode after episode of this exciting intelligent new drama
## class.anger class.anticipation class.disgust class.fear class.joy
## 1 5 12 2 6 7
## 2 2 5 2 2 2
## 3 7 10 1 6 10
## 4 0 2 1 1 2
## 5 9 12 5 9 8
## 6 2 4 0 2 2
## class.sadness class.surprise class.trust class.negative class.positive
## 1 2 3 13 11 24
## 2 1 1 2 3 3
## 3 5 8 14 11 24
## 4 2 0 2 3 5
## 5 9 8 15 16 24
## 6 1 1 1 5 8
clean_df <- tbl_df(clean)
write.csv(clean.reviews, "IMDb.CSV")
#Perfrom data cleaning and calculate the final score
IMDb1<- clean_df %>%
select(text, positive=class.positive, negative= class.negative, -(class.anger:class.trust))%>%
mutate(Total = positive - negative)
head(IMDb1)
## # A tibble: 6 <U+00D7> 4
## text
## <fctr>
## 1 i firmly believe that one of the major aspects of what makes house of cards
## 2 when i thought about francis urquhart of the original house of cards series
## 3 fans of david fincher and kevin spacey have been eagerly looking forward to
## 4 just watched the first episode it is outstanding in every sense of the word
## 5 i was so looking forward to this having been a big fan of the original bbc
## 6 from the start kevin spacey captivates impresses with his his portrayal as
## # ... with 3 more variables: positive <dbl>, negative <dbl>, Total <dbl>
write.csv(IMDb1, "TotalIMDb.CSV")
FinalIMDb <- select(IMDb1,text,Total)
head(FinalIMDb)
## # A tibble: 6 <U+00D7> 2
## text
## <fctr>
## 1 i firmly believe that one of the major aspects of what makes house of cards
## 2 when i thought about francis urquhart of the original house of cards series
## 3 fans of david fincher and kevin spacey have been eagerly looking forward to
## 4 just watched the first episode it is outstanding in every sense of the word
## 5 i was so looking forward to this having been a big fan of the original bbc
## 6 from the start kevin spacey captivates impresses with his his portrayal as
## # ... with 1 more variables: Total <dbl>
#reshape my data then visualize the analyis
IMDb1 %>% gather(sentiment, scores, -text) %>%
ggplot(data = .) +
geom_line(aes(x = text, y = scores, group = sentiment, color = sentiment))+ggtitle("Compare Sentimental Scores for IMDb User Reviews")
clean_df %>%
gather(sentiment, scores, -text) %>%
ggplot() +
geom_bar(aes(y = scores, x = text, fill = sentiment), stat = "identity")+ggtitle("Total Sentimental Scores for IMDb User Reviews")
#import the data frame into MySQL
library("RMySQL")
## Loading required package: DBI
library("knitr")
dbConnection<- dbConnect(dbDriver("MySQL"), user="root", password="", dbname="IMDb", host="127.0.0.1", port=3306)
dbWriteTable(conn = dbConnection, name = 'IMDbFinal', value = as.data.frame(FinalIMDb))
## [1] TRUE
all_cons <- dbListConnections(MySQL())
for(con in all_cons)
dbDisconnect(con)
#document classification
doc_matrix <- create_matrix(FinalIMDb$text, language="english", removeNumbers=TRUE,
stemWords=TRUE, removeSparseTerms=.99)
doc_matrix
## <<DocumentTermMatrix (documents: 142, terms: 1898)>>
## Non-/sparse entries: 14176/255340
## Sparsity : 95%
## Maximal term length: 14
## Weighting : term frequency (tf)
container <- create_container(doc_matrix, FinalIMDb$text, trainSize=1:109,
testSize=110:122, virgin=FALSE)
SVM <- train_model(container,"SVM")
MAXENT <- train_model(container,"MAXENT")
SVM_CLASSIFY <- classify_model(container, SVM)
MAXENT_CLASSIFY <- classify_model(container, MAXENT)
head(SVM_CLASSIFY)
## SVM_LABEL
## 1 anything that kevin spacey does is usually worth a look but this series misses the mark the problems start in the very first episode which resorts to a blatant deus ex machina to advance the entire series plot in the form of a partially shredded education bill that ends up in the intended wrong hands thereby setting into motion the grand plot to secure the vice presidency for mr spacey s character rep francis underwood btw underwood intends to ascend to the vp spot not through an election but by appointment by enticing the sitting vp to give up his job and to go back to pennsylvania to run for governor the job he left to take the vp spot on the newly elected president s ticket sound far fetched uh yeah the release of this toxic early draft to the press is central to the entire plot moving forward we re to believe that rep underwood purposefully and personally half shreds a document in front of the eyes of the newly appointed education secretary who wrote it and that neither this secretary nor anyone on his staff had the smarts to fully shred the document after rep underwood leaves the office all that s left is for one of underwood s operatives to dumpster dive after hours to retrieve said document psst it ll be easy to find it s the half shredded one so underwood can turn the document over to the insufferable cub reporter zoe barnes who will unwittingly initiate underwood s plot by getting the contents of the toxic bill published in the washington post er herald this sets up an unbelievable set of domino like circumstances that lead to one person after another falling victim to underwood s lust for power by episode we re to believe that underwood the democratic majority whip has somehow pulled off a major coup by getting the house majority leader of his own party to unwittingly run a challenge to unseat the house speaker a plot that when discovered costs the majority leader his job underwood pulls off this little coup by going against his own party getting republicans to pledge their votes to oust the speaker coupled with the help of renegade democratic representatives we re asked to suspend disbelief in a scene where the three men meet privately with the speaker believing the number man in the house underwood over his right hand number it all falls apart as planned the speaker retains his job the majority leader is ousted replaced by a member of the black caucus hand picked by guess who underwood and underwood s first major victory in his quest for the vp slot is secured and what is the comeuppance for that why nothing in a town where everyone knows the deepest secrets of everyone else we re supposed to believe that mr underwood s majority whip faces no retribution from his own party for conspiring to lead a republican dominated coup against a sitting speaker in his own party we re to believe that no one sees any personal political advantage in informing the speaker that his is a dangerous man a man who by episode or resorts to murder to clean up a mess he s created btw the murder happens when underwood leaves a car running in a garage to asphyxiate his drunken victim he wipes down the car to erase his fingerprints question if the police are going to check for fingerprints on the dead man s car wouldn t the total lack of fingerprints on the driver s side door and the steering wheel set off alarms that maybe this wasn t a suicide all of the characters in this series are self centered assholes who draw little happiness from anything they do none of them seems to have a game plan that considers an end game it s like high school where the bullies spend each day finding new ways to bully different people with no reason or ultimate purpose behind their actions sadly each character comes off as a half written caricature of a human being they re all unidimensional and transparent because of this the series is quite predictable scene after scene evolves exactly as one expects it to evolve i found myself imaging lines of dialog that then came out of the character s mouths an instant later i kid you not other reviewers have noted the many many asides mr spacey has i know that this is a sop to richard ii upon which the original house of cards was based but this breaking of the fourth wall becomes tedious rather quickly especially as the asides do nothing but confirm what we ve already inferred was rep underwood s inner monologue the music to the series is dull as dishwater as well annoying in fact it s like the music from glengarry glen ross coupled with the remake of the italian job so much so that i was muting the opening credits by episode there s also way too much music serving as background to dialog like i said it s annoying that said there s some good acting going on especially when one considers the unimaginative material this is another series that didn t live up to the hype i ve heard i will say it s better than the newsroom which has even more stereotypical characters and leaden unnatural dialog than this but that s not saying much out of worth watching at some point but not exactly high on the list of things to do
## 2 anything that kevin spacey does is usually worth a look but this series misses the mark the problems start in the very first episode which resorts to a blatant deus ex machina to advance the entire series plot in the form of a partially shredded education bill that ends up in the intended wrong hands thereby setting into motion the grand plot to secure the vice presidency for mr spacey s character rep francis underwood btw underwood intends to ascend to the vp spot not through an election but by appointment by enticing the sitting vp to give up his job and to go back to pennsylvania to run for governor the job he left to take the vp spot on the newly elected president s ticket sound far fetched uh yeah the release of this toxic early draft to the press is central to the entire plot moving forward we re to believe that rep underwood purposefully and personally half shreds a document in front of the eyes of the newly appointed education secretary who wrote it and that neither this secretary nor anyone on his staff had the smarts to fully shred the document after rep underwood leaves the office all that s left is for one of underwood s operatives to dumpster dive after hours to retrieve said document psst it ll be easy to find it s the half shredded one so underwood can turn the document over to the insufferable cub reporter zoe barnes who will unwittingly initiate underwood s plot by getting the contents of the toxic bill published in the washington post er herald this sets up an unbelievable set of domino like circumstances that lead to one person after another falling victim to underwood s lust for power by episode we re to believe that underwood the democratic majority whip has somehow pulled off a major coup by getting the house majority leader of his own party to unwittingly run a challenge to unseat the house speaker a plot that when discovered costs the majority leader his job underwood pulls off this little coup by going against his own party getting republicans to pledge their votes to oust the speaker coupled with the help of renegade democratic representatives we re asked to suspend disbelief in a scene where the three men meet privately with the speaker believing the number man in the house underwood over his right hand number it all falls apart as planned the speaker retains his job the majority leader is ousted replaced by a member of the black caucus hand picked by guess who underwood and underwood s first major victory in his quest for the vp slot is secured and what is the comeuppance for that why nothing in a town where everyone knows the deepest secrets of everyone else we re supposed to believe that mr underwood s majority whip faces no retribution from his own party for conspiring to lead a republican dominated coup against a sitting speaker in his own party we re to believe that no one sees any personal political advantage in informing the speaker that his is a dangerous man a man who by episode or resorts to murder to clean up a mess he s created btw the murder happens when underwood leaves a car running in a garage to asphyxiate his drunken victim he wipes down the car to erase his fingerprints question if the police are going to check for fingerprints on the dead man s car wouldn t the total lack of fingerprints on the driver s side door and the steering wheel set off alarms that maybe this wasn t a suicide all of the characters in this series are self centered assholes who draw little happiness from anything they do none of them seems to have a game plan that considers an end game it s like high school where the bullies spend each day finding new ways to bully different people with no reason or ultimate purpose behind their actions sadly each character comes off as a half written caricature of a human being they re all unidimensional and transparent because of this the series is quite predictable scene after scene evolves exactly as one expects it to evolve i found myself imaging lines of dialog that then came out of the character s mouths an instant later i kid you not other reviewers have noted the many many asides mr spacey has i know that this is a sop to richard ii upon which the original house of cards was based but this breaking of the fourth wall becomes tedious rather quickly especially as the asides do nothing but confirm what we ve already inferred was rep underwood s inner monologue the music to the series is dull as dishwater as well annoying in fact it s like the music from glengarry glen ross coupled with the remake of the italian job so much so that i was muting the opening credits by episode there s also way too much music serving as background to dialog like i said it s annoying that said there s some good acting going on especially when one considers the unimaginative material this is another series that didn t live up to the hype i ve heard i will say it s better than the newsroom which has even more stereotypical characters and leaden unnatural dialog than this but that s not saying much out of worth watching at some point but not exactly high on the list of things to do
## 3 anything that kevin spacey does is usually worth a look but this series misses the mark the problems start in the very first episode which resorts to a blatant deus ex machina to advance the entire series plot in the form of a partially shredded education bill that ends up in the intended wrong hands thereby setting into motion the grand plot to secure the vice presidency for mr spacey s character rep francis underwood btw underwood intends to ascend to the vp spot not through an election but by appointment by enticing the sitting vp to give up his job and to go back to pennsylvania to run for governor the job he left to take the vp spot on the newly elected president s ticket sound far fetched uh yeah the release of this toxic early draft to the press is central to the entire plot moving forward we re to believe that rep underwood purposefully and personally half shreds a document in front of the eyes of the newly appointed education secretary who wrote it and that neither this secretary nor anyone on his staff had the smarts to fully shred the document after rep underwood leaves the office all that s left is for one of underwood s operatives to dumpster dive after hours to retrieve said document psst it ll be easy to find it s the half shredded one so underwood can turn the document over to the insufferable cub reporter zoe barnes who will unwittingly initiate underwood s plot by getting the contents of the toxic bill published in the washington post er herald this sets up an unbelievable set of domino like circumstances that lead to one person after another falling victim to underwood s lust for power by episode we re to believe that underwood the democratic majority whip has somehow pulled off a major coup by getting the house majority leader of his own party to unwittingly run a challenge to unseat the house speaker a plot that when discovered costs the majority leader his job underwood pulls off this little coup by going against his own party getting republicans to pledge their votes to oust the speaker coupled with the help of renegade democratic representatives we re asked to suspend disbelief in a scene where the three men meet privately with the speaker believing the number man in the house underwood over his right hand number it all falls apart as planned the speaker retains his job the majority leader is ousted replaced by a member of the black caucus hand picked by guess who underwood and underwood s first major victory in his quest for the vp slot is secured and what is the comeuppance for that why nothing in a town where everyone knows the deepest secrets of everyone else we re supposed to believe that mr underwood s majority whip faces no retribution from his own party for conspiring to lead a republican dominated coup against a sitting speaker in his own party we re to believe that no one sees any personal political advantage in informing the speaker that his is a dangerous man a man who by episode or resorts to murder to clean up a mess he s created btw the murder happens when underwood leaves a car running in a garage to asphyxiate his drunken victim he wipes down the car to erase his fingerprints question if the police are going to check for fingerprints on the dead man s car wouldn t the total lack of fingerprints on the driver s side door and the steering wheel set off alarms that maybe this wasn t a suicide all of the characters in this series are self centered assholes who draw little happiness from anything they do none of them seems to have a game plan that considers an end game it s like high school where the bullies spend each day finding new ways to bully different people with no reason or ultimate purpose behind their actions sadly each character comes off as a half written caricature of a human being they re all unidimensional and transparent because of this the series is quite predictable scene after scene evolves exactly as one expects it to evolve i found myself imaging lines of dialog that then came out of the character s mouths an instant later i kid you not other reviewers have noted the many many asides mr spacey has i know that this is a sop to richard ii upon which the original house of cards was based but this breaking of the fourth wall becomes tedious rather quickly especially as the asides do nothing but confirm what we ve already inferred was rep underwood s inner monologue the music to the series is dull as dishwater as well annoying in fact it s like the music from glengarry glen ross coupled with the remake of the italian job so much so that i was muting the opening credits by episode there s also way too much music serving as background to dialog like i said it s annoying that said there s some good acting going on especially when one considers the unimaginative material this is another series that didn t live up to the hype i ve heard i will say it s better than the newsroom which has even more stereotypical characters and leaden unnatural dialog than this but that s not saying much out of worth watching at some point but not exactly high on the list of things to do
## 4 anything that kevin spacey does is usually worth a look but this series misses the mark the problems start in the very first episode which resorts to a blatant deus ex machina to advance the entire series plot in the form of a partially shredded education bill that ends up in the intended wrong hands thereby setting into motion the grand plot to secure the vice presidency for mr spacey s character rep francis underwood btw underwood intends to ascend to the vp spot not through an election but by appointment by enticing the sitting vp to give up his job and to go back to pennsylvania to run for governor the job he left to take the vp spot on the newly elected president s ticket sound far fetched uh yeah the release of this toxic early draft to the press is central to the entire plot moving forward we re to believe that rep underwood purposefully and personally half shreds a document in front of the eyes of the newly appointed education secretary who wrote it and that neither this secretary nor anyone on his staff had the smarts to fully shred the document after rep underwood leaves the office all that s left is for one of underwood s operatives to dumpster dive after hours to retrieve said document psst it ll be easy to find it s the half shredded one so underwood can turn the document over to the insufferable cub reporter zoe barnes who will unwittingly initiate underwood s plot by getting the contents of the toxic bill published in the washington post er herald this sets up an unbelievable set of domino like circumstances that lead to one person after another falling victim to underwood s lust for power by episode we re to believe that underwood the democratic majority whip has somehow pulled off a major coup by getting the house majority leader of his own party to unwittingly run a challenge to unseat the house speaker a plot that when discovered costs the majority leader his job underwood pulls off this little coup by going against his own party getting republicans to pledge their votes to oust the speaker coupled with the help of renegade democratic representatives we re asked to suspend disbelief in a scene where the three men meet privately with the speaker believing the number man in the house underwood over his right hand number it all falls apart as planned the speaker retains his job the majority leader is ousted replaced by a member of the black caucus hand picked by guess who underwood and underwood s first major victory in his quest for the vp slot is secured and what is the comeuppance for that why nothing in a town where everyone knows the deepest secrets of everyone else we re supposed to believe that mr underwood s majority whip faces no retribution from his own party for conspiring to lead a republican dominated coup against a sitting speaker in his own party we re to believe that no one sees any personal political advantage in informing the speaker that his is a dangerous man a man who by episode or resorts to murder to clean up a mess he s created btw the murder happens when underwood leaves a car running in a garage to asphyxiate his drunken victim he wipes down the car to erase his fingerprints question if the police are going to check for fingerprints on the dead man s car wouldn t the total lack of fingerprints on the driver s side door and the steering wheel set off alarms that maybe this wasn t a suicide all of the characters in this series are self centered assholes who draw little happiness from anything they do none of them seems to have a game plan that considers an end game it s like high school where the bullies spend each day finding new ways to bully different people with no reason or ultimate purpose behind their actions sadly each character comes off as a half written caricature of a human being they re all unidimensional and transparent because of this the series is quite predictable scene after scene evolves exactly as one expects it to evolve i found myself imaging lines of dialog that then came out of the character s mouths an instant later i kid you not other reviewers have noted the many many asides mr spacey has i know that this is a sop to richard ii upon which the original house of cards was based but this breaking of the fourth wall becomes tedious rather quickly especially as the asides do nothing but confirm what we ve already inferred was rep underwood s inner monologue the music to the series is dull as dishwater as well annoying in fact it s like the music from glengarry glen ross coupled with the remake of the italian job so much so that i was muting the opening credits by episode there s also way too much music serving as background to dialog like i said it s annoying that said there s some good acting going on especially when one considers the unimaginative material this is another series that didn t live up to the hype i ve heard i will say it s better than the newsroom which has even more stereotypical characters and leaden unnatural dialog than this but that s not saying much out of worth watching at some point but not exactly high on the list of things to do
## 5 anything that kevin spacey does is usually worth a look but this series misses the mark the problems start in the very first episode which resorts to a blatant deus ex machina to advance the entire series plot in the form of a partially shredded education bill that ends up in the intended wrong hands thereby setting into motion the grand plot to secure the vice presidency for mr spacey s character rep francis underwood btw underwood intends to ascend to the vp spot not through an election but by appointment by enticing the sitting vp to give up his job and to go back to pennsylvania to run for governor the job he left to take the vp spot on the newly elected president s ticket sound far fetched uh yeah the release of this toxic early draft to the press is central to the entire plot moving forward we re to believe that rep underwood purposefully and personally half shreds a document in front of the eyes of the newly appointed education secretary who wrote it and that neither this secretary nor anyone on his staff had the smarts to fully shred the document after rep underwood leaves the office all that s left is for one of underwood s operatives to dumpster dive after hours to retrieve said document psst it ll be easy to find it s the half shredded one so underwood can turn the document over to the insufferable cub reporter zoe barnes who will unwittingly initiate underwood s plot by getting the contents of the toxic bill published in the washington post er herald this sets up an unbelievable set of domino like circumstances that lead to one person after another falling victim to underwood s lust for power by episode we re to believe that underwood the democratic majority whip has somehow pulled off a major coup by getting the house majority leader of his own party to unwittingly run a challenge to unseat the house speaker a plot that when discovered costs the majority leader his job underwood pulls off this little coup by going against his own party getting republicans to pledge their votes to oust the speaker coupled with the help of renegade democratic representatives we re asked to suspend disbelief in a scene where the three men meet privately with the speaker believing the number man in the house underwood over his right hand number it all falls apart as planned the speaker retains his job the majority leader is ousted replaced by a member of the black caucus hand picked by guess who underwood and underwood s first major victory in his quest for the vp slot is secured and what is the comeuppance for that why nothing in a town where everyone knows the deepest secrets of everyone else we re supposed to believe that mr underwood s majority whip faces no retribution from his own party for conspiring to lead a republican dominated coup against a sitting speaker in his own party we re to believe that no one sees any personal political advantage in informing the speaker that his is a dangerous man a man who by episode or resorts to murder to clean up a mess he s created btw the murder happens when underwood leaves a car running in a garage to asphyxiate his drunken victim he wipes down the car to erase his fingerprints question if the police are going to check for fingerprints on the dead man s car wouldn t the total lack of fingerprints on the driver s side door and the steering wheel set off alarms that maybe this wasn t a suicide all of the characters in this series are self centered assholes who draw little happiness from anything they do none of them seems to have a game plan that considers an end game it s like high school where the bullies spend each day finding new ways to bully different people with no reason or ultimate purpose behind their actions sadly each character comes off as a half written caricature of a human being they re all unidimensional and transparent because of this the series is quite predictable scene after scene evolves exactly as one expects it to evolve i found myself imaging lines of dialog that then came out of the character s mouths an instant later i kid you not other reviewers have noted the many many asides mr spacey has i know that this is a sop to richard ii upon which the original house of cards was based but this breaking of the fourth wall becomes tedious rather quickly especially as the asides do nothing but confirm what we ve already inferred was rep underwood s inner monologue the music to the series is dull as dishwater as well annoying in fact it s like the music from glengarry glen ross coupled with the remake of the italian job so much so that i was muting the opening credits by episode there s also way too much music serving as background to dialog like i said it s annoying that said there s some good acting going on especially when one considers the unimaginative material this is another series that didn t live up to the hype i ve heard i will say it s better than the newsroom which has even more stereotypical characters and leaden unnatural dialog than this but that s not saying much out of worth watching at some point but not exactly high on the list of things to do
## 6 anything that kevin spacey does is usually worth a look but this series misses the mark the problems start in the very first episode which resorts to a blatant deus ex machina to advance the entire series plot in the form of a partially shredded education bill that ends up in the intended wrong hands thereby setting into motion the grand plot to secure the vice presidency for mr spacey s character rep francis underwood btw underwood intends to ascend to the vp spot not through an election but by appointment by enticing the sitting vp to give up his job and to go back to pennsylvania to run for governor the job he left to take the vp spot on the newly elected president s ticket sound far fetched uh yeah the release of this toxic early draft to the press is central to the entire plot moving forward we re to believe that rep underwood purposefully and personally half shreds a document in front of the eyes of the newly appointed education secretary who wrote it and that neither this secretary nor anyone on his staff had the smarts to fully shred the document after rep underwood leaves the office all that s left is for one of underwood s operatives to dumpster dive after hours to retrieve said document psst it ll be easy to find it s the half shredded one so underwood can turn the document over to the insufferable cub reporter zoe barnes who will unwittingly initiate underwood s plot by getting the contents of the toxic bill published in the washington post er herald this sets up an unbelievable set of domino like circumstances that lead to one person after another falling victim to underwood s lust for power by episode we re to believe that underwood the democratic majority whip has somehow pulled off a major coup by getting the house majority leader of his own party to unwittingly run a challenge to unseat the house speaker a plot that when discovered costs the majority leader his job underwood pulls off this little coup by going against his own party getting republicans to pledge their votes to oust the speaker coupled with the help of renegade democratic representatives we re asked to suspend disbelief in a scene where the three men meet privately with the speaker believing the number man in the house underwood over his right hand number it all falls apart as planned the speaker retains his job the majority leader is ousted replaced by a member of the black caucus hand picked by guess who underwood and underwood s first major victory in his quest for the vp slot is secured and what is the comeuppance for that why nothing in a town where everyone knows the deepest secrets of everyone else we re supposed to believe that mr underwood s majority whip faces no retribution from his own party for conspiring to lead a republican dominated coup against a sitting speaker in his own party we re to believe that no one sees any personal political advantage in informing the speaker that his is a dangerous man a man who by episode or resorts to murder to clean up a mess he s created btw the murder happens when underwood leaves a car running in a garage to asphyxiate his drunken victim he wipes down the car to erase his fingerprints question if the police are going to check for fingerprints on the dead man s car wouldn t the total lack of fingerprints on the driver s side door and the steering wheel set off alarms that maybe this wasn t a suicide all of the characters in this series are self centered assholes who draw little happiness from anything they do none of them seems to have a game plan that considers an end game it s like high school where the bullies spend each day finding new ways to bully different people with no reason or ultimate purpose behind their actions sadly each character comes off as a half written caricature of a human being they re all unidimensional and transparent because of this the series is quite predictable scene after scene evolves exactly as one expects it to evolve i found myself imaging lines of dialog that then came out of the character s mouths an instant later i kid you not other reviewers have noted the many many asides mr spacey has i know that this is a sop to richard ii upon which the original house of cards was based but this breaking of the fourth wall becomes tedious rather quickly especially as the asides do nothing but confirm what we ve already inferred was rep underwood s inner monologue the music to the series is dull as dishwater as well annoying in fact it s like the music from glengarry glen ross coupled with the remake of the italian job so much so that i was muting the opening credits by episode there s also way too much music serving as background to dialog like i said it s annoying that said there s some good acting going on especially when one considers the unimaginative material this is another series that didn t live up to the hype i ve heard i will say it s better than the newsroom which has even more stereotypical characters and leaden unnatural dialog than this but that s not saying much out of worth watching at some point but not exactly high on the list of things to do
## SVM_PROB
## 1 0.01668241
## 2 0.01650718
## 3 0.01503996
## 4 0.01723552
## 5 0.01766888
## 6 0.01614773
head(MAXENT_CLASSIFY)
## MAXENTROPY_LABEL
## 1 in ian richardson looked into the foreground on the camera breaking the so called fourth wall exposed the political corruption that inhabited the embers of thatcherism more than years later netflix relaunches house of cards with new faces and a new context except for the nostalgic the remake is worth with the first season we can recommend the series to all those who have enjoyed a cynical view of power in many countries the acting directors and campus is truly remarkable the concurrence of kevin spacey and robin wright and david fincher s expertise in the management are as healthy as i ve seen in recent american television they emanate a cynical harsh and bitter tone stress exacerbating the satirical component of the original version humorous notes english flavour but mood softened the harshness of the story despite the overall strength of the series in his first season even though remarkable the series does not reach the depth of products like the wire in house of cards lack coral greater role and ultimately a relatively shallow product that pivots on the axis of the character underwood spacey on the other hand the trend of the script to affect romances also belies something of a series that sometimes seems to treat the world of politics more like a set that as the true centre of the dash instead of a serious social reflection politics sometimes appears as a mere excuse
## 2 i love this so much i love kevin spacey i love robin wright i love the characters introduced and i love the smart structure of the episodes my opinion out of the way it s incredibly well thought out and knows how to constantly pull you in dragging you further and further through obstacles and plots these writers know what you want and give you every little bit of it after being turned down for secretary of state frank underwood kevin spacey develops an evil plot to ruin the lives of the people who betrayed him in order to become into a greater state of power helped by his equally conniving wife robin wright if you re a kevin spacey fan then this is your fantasy come true i m not saying only kevin spacey fans will enjoy this but a lot of each episode is watching him manipulate people to no end there s other subplots going on but that s the main focus a lot of episodes per season are a little samey but give you enough development of other characters to get you by doug stamper the chief of staff becomes an unexpected main character later on that you really learn to care for watching kevin spacey literally break the rules of politics to get what he wants is too irresistible it s something you simply need to see for yourself
## 3 based on a book by michael dobbs and a british show of the same name house of cards tells a story of an ambitious and maleficent us congressman francis underwood played by kevin spacey who schemes his way to more and more power having only seen bits of the british version it appeared to be smarter but less exciting an expected clich difference between anything american and british ian richardson who plays the main anti hero of the british show is a known name and his character has a certain charm but the american kevin spacey is well kevin spacey is kevin spacey he is not seen in the mainstream movies nearly enough but anytime he shows up he always takes over whatever scene he is in kevin s performance can be hypnotizingly delicious and several hours of it are more than welcome he is best at playing villains and how fortunate is it that house of cards puts a villain in the front seat one of the main gimmicks of the show is that francis talks directly to the viewer commenting on various events and these monologues are some of the best moments in the show in short this was a perfect casting there is one issue with his acting although spacey is great in his role there is a constant recurrence of a particular type of performance that is rather annoying when francis underwood talks to someone whom he tries to manipulate he talks in a special voice in a sarcastic tone the makers of the show could not have been unaware of this so it is surely done on purpose presumably to inform the viewer when manipulation is happening but why this type of performance can be seen in many other shows and movies and its use there either seems silly as well but especially in a serious show about politics considering the kind of viewers who would watch it why does the show feel the need to dumb down the manipulation after all the show does not explain the workings of the various political systems so why use the funny voice when talking about them the scheming of francis underwood is delightful to watch though as he puts his arrogance greed for power and hatred behind the steering wheel especially because they are realistically implemented into his character frank is not a cartoonish villain but a person who sees as weakness the moral barriers that prevent most people from stooping down to using overly depraved methods in achieving their goals and so he thinks himself to be stronger and smarter but he too is capable of exhibiting honorable emotions even if they still ultimately stem from arrogance though the underwoods are destroying most people around them in cold blood they still form emotional attachments to certain people but only as long as those people are loyal and subordinate to them it is nice to see a largely consistent and complex character on tv instead of the empty pages that you see in most other shows that change from episode to episode depending on what is being written into them there is some inconsistency though francis is presented as a mastermind but twice during the show he is personally involved in murder this seems counter to the ruthless intelligence that is attributed to him and really interrupts the flow of the show murder is stupid it is usually hard to execute well and is extremely risky especially for a character in frank s position for whom a mere implication in a murder case would mean the end of his political career an impulsive murder committed out of absolute necessity may be understandable but that is not how house of cards plays it out and the murders are not the only situations in which the show jumps the shark there are multiple moments where it goes too far for the sake of adding spice to politics but no doubt these moments will not be a problem for many people who do not have interest in realism i get irritated when i see something unrealistic or inconsistent happening while playing computer games but i know that many other players only care about the entertainment value the story starts going down towards the middle part of the nd season as it becomes considerably more dry and contrived lots of talking makes it seem like something complicated and manipulative is going on when in fact it does not motivations are mysterious and many conversations start to carry the conspiracy tone of the x files series all the while most characters act as clueless pawns in frank s game if they were going to make serious national and international politics part of the show they should have done it well people who say that real politics are boring are wrong look at cnn look at bbc there is so much stuff going on jon stuart made a career covering the comedic side of politics alone however even if the show occasionally feels forced or dry kevin pulls it through and if i am honest i do not care what that man talks about as long as he does it on my screen so in conclusion kevin spacey
## 4 i m almost through season others have commented on the many positive aspects of this show for me the most compelling sequences have been the deeply touching moments between frank and claire which counter their apparent cut throat business like marriage however the show s appeal is declining with each season and lately is plagued by too many dropped story lines and continuity gaps as one example a big production was made of frank s promise not to run in and trading that for support of the amworks bill now in episode frank is openly campaigning the amworks effort was begun in d c several episodes ago and the writers did not bother to connect the dots did frank openly renege on his promise or did the deal fall through what happened to amworks another example of lazy writing and continuity gaps is when frank appoints claire as u n ambassador during a congressional recess after being voted down by the senate despite frank having historically low approval ratings and being in the controversial infancy of his predency that very risky move went down without so much as a single news story or any apparent fallout whatsoever amazing the show has devolved into a series of short term crises that last two or three episodes and lacks the continuity it had in earlier seasons
## 5 i have just arrived at episode but still waiting for the suspense i experienced in season one and two so far season three is just a collection of stories around made up political incidents like those in west wing i d rather see a plot developing like you see in other blockbuster series such as the following and indeed house of cards one and two still five episodes to watch though after which i shall post a final judgment the quality of the acting is beyond doubt of the highest standards the casting even better but i wonder if the storyline comes from the same scriptwriters as before my rating therefor is relative to the previous seasons
## 6 i don t usually write reviews for programmes even though i watch quite a lot of television but i felt like i had to write a review for house of cards simply because i didn t want people making the error i made being from the united kingdom i was cautious about watching house of cards for some months thinking that due to the differences in our political systems i wouldn t understand an awful lot of what was going on how very wrong i was yes house of cards is a political drama but it is so much more than that it is about power manipulation control kevin spacey gives a performance that is second to none truly he should be lining up awards for his portrayal of francis underwood i am only coming to the end of season myself but i am already hooked and very impressed by what i have seen so far basically to summarise where ever you are from you need to watch house of cards
## MAXENTROPY_PROB
## 1 0.9999931
## 2 0.9999939
## 3 0.8344754
## 4 0.9999975
## 5 0.7329976
## 6 0.3524179
In this projec, I used Twitter APIs, Datumbox APIs and web scraping from IMDb.com, and performed a variety of analysis on the datasets. As expected, House of Cards has received all positive reviews from the users on Twitter and IMDb, it was interesting to see how IMDb users had a relatively high degree of trust towards the show. I also realized that it was quite challenging to conduct sentimental analysis for the show because a lot of users like use so-called negative words to express their positive impressions, words like “House of Cards is killing it!” or “OMG no way.”
[1] http://diggdata.in/post/50938118301/fetching-twitter-data-in-r-with-oauth-handshake-feature
[2] https://blog.rstudio.org/2014/11/24/rvest-easy-web-scraping-with-r/
[3] http://www.cs.uic.edu/~liub/FBS/sentiment-analysis.html
[4] https://rpubs.com/michael-jules/visualizing-machine-learning
[5] https://www.r-bloggers.com/twitter-sentiment-analysis-with-r/
[6] http://thinktostart.com/sentiment-analysis-on-twitter-with-datumbox-api/#comments