#install.packages("rvest")
#install.packages("magrittr")
library(rvest)
## Warning: package 'rvest' was built under R version 3.5.1
## Loading required package: xml2
## Warning: package 'xml2' was built under R version 3.5.1
library(XML)
##
## Attaching package: 'XML'
## The following object is masked from 'package:rvest':
##
## xml
library(magrittr)
## Warning: package 'magrittr' was built under R version 3.5.1
#install.packages("tm")
library(tm)
## Warning: package 'tm' was built under R version 3.5.1
## Loading required package: NLP
# Amazon Reviews #############################
aurl <- "https://www.amazon.in/Apple-iPhone-X-Silver-256GB/product-reviews/B071P37652/ref=dpx_acr_txt?showViewpoints"
amazon_reviews <- NULL
for (i in 1:20){
murl <- read_html(as.character(paste(aurl,i,sep="=")))
rev <- murl %>%
html_nodes(".review-text") %>%
html_text()
amazon_reviews <- c(amazon_reviews,rev)
}
#Storing into TextFile
write.table(amazon_reviews,"iphoneX.txt")
getwd()
## [1] "D:/DataScience/Working Directory"
#Converting from Vector to Corpus
x <- read.csv("D:\\DataScience\\Assignments\\TextMining\\iphoneX.csv")
str(x)
## 'data.frame': 200 obs. of 1 variable:
## $ x: Factor w/ 200 levels "1 When you are purchasing any Apple's product on Amazon, you are just pushing your luck.Becouse if unfortunatel"| __truncated__,..: 1 112 124 135 146 157 168 179 190 2 ...
x1 <-Corpus(VectorSource(x))
Amazon_pros <- x$x
x1 <-Corpus(VectorSource(Amazon_pros))
inspect(x1[1])
## <<SimpleCorpus>>
## Metadata: corpus specific: 1, document level (indexed): 0
## Content: documents: 1
##
## [1] 1 When you are purchasing any Apple's product on Amazon, you are just pushing your luck.Becouse if unfortunately the device you bought turn out to be defective out of the box (like mine) then you have no other choice then to leave it on any Apple service center and get it REPAIRED!... yes \\repaired\\ not replaced.That \\10 days replacement promise in case of defective product received\\ is there to only misguide customers, this policy does not apply on any Apple's product, you will get to know this only when you read the \\terms and conditions\\ inside.I ordered the iphone X and received a defective phone, it just stuck on Apple logo when I turned it on. Reported this issue immediately to Amazon support, they told me not to worry, just visit Apple service centre, if your phone is defective you will get replacement there, but at apple service centre they offered only repair under warranty not replacement.I took my phone as it was, thinking that I can easily get a replacement on Amazon under the 10 days replacement policy in case of defective product received.But when I tried to create a replacement request, I shocked to see that it just ends on showing Apple customer support information!There was no option for replacement.Now I have no choice other than to accept a repaired iphone X for full price I paid for brand new iPhone X.Very disappointed from Amazon and Apple.
x2 <- tm_map(x1,tolower)
## Warning in tm_map.SimpleCorpus(x1, tolower): transformation drops documents
inspect(x2[1])
## <<SimpleCorpus>>
## Metadata: corpus specific: 1, document level (indexed): 0
## Content: documents: 1
##
## [1] 1 when you are purchasing any apple's product on amazon, you are just pushing your luck.becouse if unfortunately the device you bought turn out to be defective out of the box (like mine) then you have no other choice then to leave it on any apple service center and get it repaired!... yes \\repaired\\ not replaced.that \\10 days replacement promise in case of defective product received\\ is there to only misguide customers, this policy does not apply on any apple's product, you will get to know this only when you read the \\terms and conditions\\ inside.i ordered the iphone x and received a defective phone, it just stuck on apple logo when i turned it on. reported this issue immediately to amazon support, they told me not to worry, just visit apple service centre, if your phone is defective you will get replacement there, but at apple service centre they offered only repair under warranty not replacement.i took my phone as it was, thinking that i can easily get a replacement on amazon under the 10 days replacement policy in case of defective product received.but when i tried to create a replacement request, i shocked to see that it just ends on showing apple customer support information!there was no option for replacement.now i have no choice other than to accept a repaired iphone x for full price i paid for brand new iphone x.very disappointed from amazon and apple.
x3 <- tm_map(x2,removeNumbers)
## Warning in tm_map.SimpleCorpus(x2, removeNumbers): transformation drops
## documents
inspect(x3[1])
## <<SimpleCorpus>>
## Metadata: corpus specific: 1, document level (indexed): 0
## Content: documents: 1
##
## [1] when you are purchasing any apple's product on amazon, you are just pushing your luck.becouse if unfortunately the device you bought turn out to be defective out of the box (like mine) then you have no other choice then to leave it on any apple service center and get it repaired!... yes \\repaired\\ not replaced.that \\ days replacement promise in case of defective product received\\ is there to only misguide customers, this policy does not apply on any apple's product, you will get to know this only when you read the \\terms and conditions\\ inside.i ordered the iphone x and received a defective phone, it just stuck on apple logo when i turned it on. reported this issue immediately to amazon support, they told me not to worry, just visit apple service centre, if your phone is defective you will get replacement there, but at apple service centre they offered only repair under warranty not replacement.i took my phone as it was, thinking that i can easily get a replacement on amazon under the days replacement policy in case of defective product received.but when i tried to create a replacement request, i shocked to see that it just ends on showing apple customer support information!there was no option for replacement.now i have no choice other than to accept a repaired iphone x for full price i paid for brand new iphone x.very disappointed from amazon and apple.
x4 <- tm_map(x3,removePunctuation)
## Warning in tm_map.SimpleCorpus(x3, removePunctuation): transformation drops
## documents
inspect(x4[1])
## <<SimpleCorpus>>
## Metadata: corpus specific: 1, document level (indexed): 0
## Content: documents: 1
##
## [1] when you are purchasing any apples product on amazon you are just pushing your luckbecouse if unfortunately the device you bought turn out to be defective out of the box like mine then you have no other choice then to leave it on any apple service center and get it repaired yes repaired not replacedthat days replacement promise in case of defective product received is there to only misguide customers this policy does not apply on any apples product you will get to know this only when you read the terms and conditions insidei ordered the iphone x and received a defective phone it just stuck on apple logo when i turned it on reported this issue immediately to amazon support they told me not to worry just visit apple service centre if your phone is defective you will get replacement there but at apple service centre they offered only repair under warranty not replacementi took my phone as it was thinking that i can easily get a replacement on amazon under the days replacement policy in case of defective product receivedbut when i tried to create a replacement request i shocked to see that it just ends on showing apple customer support informationthere was no option for replacementnow i have no choice other than to accept a repaired iphone x for full price i paid for brand new iphone xvery disappointed from amazon and apple
x5 <- tm_map(x4,removeWords,stopwords(kind = "en"))
## Warning in tm_map.SimpleCorpus(x4, removeWords, stopwords(kind = "en")):
## transformation drops documents
x5 <- tm_map(x5,removeWords,"phone")
## Warning in tm_map.SimpleCorpus(x5, removeWords, "phone"): transformation
## drops documents
inspect(x5[1])
## <<SimpleCorpus>>
## Metadata: corpus specific: 1, document level (indexed): 0
## Content: documents: 1
##
## [1] purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like mine choice leave apple service center get repaired yes repaired replacedthat days replacement promise case defective product received misguide customers policy apply apples product will get know read terms conditions insidei ordered iphone x received defective just stuck apple logo turned reported issue immediately amazon support told worry just visit apple service centre defective will get replacement apple service centre offered repair warranty replacementi took thinking can easily get replacement amazon days replacement policy case defective product receivedbut tried create replacement request shocked see just ends showing apple customer support informationthere option replacementnow choice accept repaired iphone x full price paid brand new iphone xvery disappointed amazon apple
x6 <- tm_map(x5,stripWhitespace)
## Warning in tm_map.SimpleCorpus(x5, stripWhitespace): transformation drops
## documents
inspect(x6[1])
## <<SimpleCorpus>>
## Metadata: corpus specific: 1, document level (indexed): 0
## Content: documents: 1
##
## [1] purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like mine choice leave apple service center get repaired yes repaired replacedthat days replacement promise case defective product received misguide customers policy apply apples product will get know read terms conditions insidei ordered iphone x received defective just stuck apple logo turned reported issue immediately amazon support told worry just visit apple service centre defective will get replacement apple service centre offered repair warranty replacementi took thinking can easily get replacement amazon days replacement policy case defective product receivedbut tried create replacement request shocked see just ends showing apple customer support informationthere option replacementnow choice accept repaired iphone x full price paid brand new iphone xvery disappointed amazon apple
FinalData <- x6
str(FinalData)
## List of 200
## $ 1 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "1"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 2 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "2"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 3 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "3"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 4 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "4"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 5 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "5"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 6 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "6"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 7 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "7"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 8 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "8"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 9 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "9"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 10 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "10"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 11 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "11"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 12 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "12"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 13 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "13"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 14 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "14"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 15 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "15"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 16 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "16"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 17 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "17"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 18 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "18"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 19 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "19"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 20 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:00"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "20"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 21 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "21"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 22 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "22"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 23 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "23"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 24 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "24"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 25 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "25"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 26 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "26"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 27 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "27"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 28 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "28"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 29 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "29"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 30 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "30"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 31 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "31"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 32 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "32"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 33 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "33"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 34 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "34"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 35 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "35"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 36 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "36"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 37 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "37"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 38 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "38"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 39 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "39"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 40 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "40"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 41 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "41"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 42 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "42"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 43 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "43"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 44 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "44"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 45 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "45"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 46 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "46"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 47 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "47"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 48 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "48"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 49 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "49"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 50 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "50"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 51 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "51"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 52 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "52"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 53 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "53"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 54 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "54"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 55 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "55"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 56 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "56"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 57 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "57"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 58 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "58"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 59 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "59"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 60 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "60"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 61 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "61"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 62 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "62"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 63 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "63"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 64 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "64"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 65 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "65"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 66 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:01"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "66"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 67 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "67"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 68 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "68"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 69 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "69"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 70 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "70"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 71 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "71"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 72 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "72"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 73 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "73"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 74 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "74"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 75 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "75"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 76 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "76"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 77 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "77"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 78 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "78"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 79 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "79"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 80 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "80"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 81 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "81"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 82 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "82"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 83 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "83"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 84 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "84"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 85 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "85"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 86 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "86"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 87 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "87"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 88 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "88"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 89 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "89"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 90 :List of 2
## ..$ content: chr " ufd"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "90"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 91 :List of 2
## ..$ content: chr " purchasing apples product amazon just pushing luckbecouse unfortunately device bought turn defective box like "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "91"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 92 :List of 2
## ..$ content: chr " fully satisfied product camera great display crispy much better samsung oneplus opt camera average camera ipho"| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "92"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 93 :List of 2
## ..$ content: chr " excellent product well deliveredhighly satisfied amazon service"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "93"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 94 :List of 2
## ..$ content: chr " excellent deal"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "94"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 95 :List of 2
## ..$ content: chr " awesome product equally fast delivery"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "95"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 96 :List of 2
## ..$ content: chr " good yes best well nolets break pros cons discuss whats packagepros one powerful smartphone market apple done "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "96"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 97 :List of 2
## ..$ content: chr " received faulty product amazon deny replace"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "97"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 98 :List of 2
## ..$ content: chr " plus iphonex th iphone battery life better small hold screen size bigger compared plus premium"
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "98"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## $ 99 :List of 2
## ..$ content: chr " fantastic display amazing overs good performance camera quality also fantasticsuperb prime day offers service "| __truncated__
## ..$ meta :List of 7
## .. ..$ author : chr(0)
## .. ..$ datetimestamp: POSIXlt[1:1], format: "2018-08-12 18:42:02"
## .. ..$ description : chr(0)
## .. ..$ heading : chr(0)
## .. ..$ id : chr "99"
## .. ..$ language : chr "en"
## .. ..$ origin : chr(0)
## .. ..- attr(*, "class")= chr "TextDocumentMeta"
## ..- attr(*, "class")= chr [1:2] "PlainTextDocument" "TextDocument"
## [list output truncated]
## - attr(*, "class")= chr [1:2] "SimpleCorpus" "Corpus"
tdm <- TermDocumentMatrix(FinalData)
tdm
## <<TermDocumentMatrix (terms: 268, documents: 200)>>
## Non-/sparse entries: 6180/47420
## Sparsity : 88%
## Maximal term length: 16
## Weighting : term frequency (tf)
tdm1 <- as.matrix(tdm)
tdm1
## Docs
## Terms 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21
## accept 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1
## amazon 4 0 1 0 0 0 1 0 2 0 4 0 1 0 0 0 1 0 2 0 4
## apple 6 0 0 0 0 7 0 0 0 0 6 0 0 0 0 7 0 0 0 0 6
## apples 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## apply 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## bought 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## box 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0 0 0 0 1
## brand 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## can 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0 1
## case 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## center 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## centre 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## choice 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## conditions 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## create 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## customer 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1
## customers 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## days 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## defective 5 0 0 0 0 0 0 0 0 0 5 0 0 0 0 0 0 0 0 0 5
## device 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0 1
## disappointed 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## easily 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## ends 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## full 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## get 4 0 0 0 0 1 0 0 0 0 4 0 0 0 0 1 0 0 0 0 4
## immediately 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## informationthere 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## insidei 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## iphone 3 1 0 0 0 0 0 1 0 0 3 1 0 0 0 0 0 1 0 0 3
## issue 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## just 4 0 0 0 0 5 0 0 0 0 4 0 0 0 0 5 0 0 0 0 4
## know 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## leave 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## like 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## logo 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## luckbecouse 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## mine 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## misguide 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## new 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## offered 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## option 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## ordered 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## paid 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## policy 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## price 1 0 0 0 0 4 0 0 0 0 1 0 0 0 0 4 0 0 0 0 1
## product 4 1 1 0 1 0 1 0 0 0 4 1 1 0 1 0 1 0 0 0 4
## promise 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## purchasing 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## pushing 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## read 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## received 2 0 0 0 0 0 1 0 0 0 2 0 0 0 0 0 1 0 0 0 2
## receivedbut 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## repair 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## repaired 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3
## replacedthat 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## replacement 5 0 0 0 0 0 0 0 0 0 5 0 0 0 0 0 0 0 0 0 5
## replacementi 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## replacementnow 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## reported 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## request 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## see 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## service 3 0 1 0 0 2 0 0 1 0 3 0 1 0 0 2 0 0 1 0 3
## shocked 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## showing 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## stuck 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## support 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2
## terms 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## thinking 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## told 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## took 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## tried 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## turn 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## turned 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## unfortunately 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## visit 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## warranty 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## will 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## worry 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## xvery 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## yes 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1
## average 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## better 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0
## camera 0 3 0 0 0 1 0 0 1 0 0 3 0 0 0 1 0 0 1 0 0
## charger 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## charging 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## con 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## crispy 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## display 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0
## fast 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0
## fully 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## great 0 2 0 0 0 3 0 0 0 0 0 2 0 0 0 3 0 0 0 0 0
## hour 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## included 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## mins 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## much 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## oneplus 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## opt 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## really 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0
## samsung 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0
## satisfied 0 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0 0 0 0
## takes 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0
## deliveredhighly 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## excellent 0 0 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0 0 0
## well 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0
## deal 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## awesome 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## delivery 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## equally 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## absurd 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## almost 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## annoying 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## another 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## anything 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## argue 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## ask 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## aspect 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## available 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## beautiful 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## benefits 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## best 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0
## biggest 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## bionic 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## bracket 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## break 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## came 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## chip 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0
## class 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## comes 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## coming 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## compared 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1 0 0 0
## connected 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## cons 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## considering 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## continue 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## convenient 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## converted 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## coupled 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## created 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## currently 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## debatable 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## depending 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## design 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## detailssimilar 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## devices 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0
## discuss 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## dollars 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## done 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## dont 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## dot 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## ecosystem 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## else 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## even 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## ever 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## every 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## everything 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## face 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## faceid 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## faster 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## feature 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## features 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## first 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## galaxy 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## giver 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## going 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## good 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0
## gorgeous 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## greatly 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## hardware 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## high 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## huawei 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## image 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## increased 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## india 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## indian 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## interface 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## ios 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## issues 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## itconslets 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## job 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## kind 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## later 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## latest 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## left 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## less 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## let 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## love 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## makes 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## market 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## mean 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## meaning 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## mind 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## natural 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## nobody 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## nolets 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## notch 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## notifications 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## one 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## optimized 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## overshadows 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## packagepros 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## packed 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## par 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## phones 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## phonesconclusion 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## point 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## powerful 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## present 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## pro 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## process 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## projection 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## pros 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## provides 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## purchase 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## quality 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0
## released 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## rupees 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## sales 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## screen 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1 0 0 0
## secure 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## selling 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## significantly 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## simplistic 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## size 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1 0 0 0
## slow 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## smaller 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## smartphone 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0
## smartphones 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## snapdragon 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## software 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## space 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## stay 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## step 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## still 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## storage 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## sums 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## time 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## two 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## unlike 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## unlocking 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## updates 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## upto 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## user 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## whats 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## whatsoever 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## deny 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## faulty 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## replace 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## battery 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## bigger 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## hold 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## iphonex 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## life 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## plus 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## premium 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## small 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## also 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## amazing 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## appario 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## day 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## fantastic 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## fantasticsuperb 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## offers 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## overs 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## performance 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## prime 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## saved 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## thank 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ufd 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## Docs
## Terms 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39
## accept 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0
## amazon 0 1 0 0 0 1 0 2 0 4 0 1 0 0 0 1 0 2
## apple 0 0 0 0 7 0 0 0 0 6 0 0 0 0 7 0 0 0
## apples 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## apply 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## bought 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## box 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0 0 0
## brand 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## can 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0 0
## case 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## center 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## centre 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## choice 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## conditions 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## create 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## customer 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0
## customers 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## days 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## defective 0 0 0 0 0 0 0 0 0 5 0 0 0 0 0 0 0 0
## device 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0 0
## disappointed 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## easily 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## ends 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## full 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## get 0 0 0 0 1 0 0 0 0 4 0 0 0 0 1 0 0 0
## immediately 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## informationthere 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## insidei 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## iphone 1 0 0 0 0 0 1 0 0 3 1 0 0 0 0 0 1 0
## issue 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## just 0 0 0 0 5 0 0 0 0 4 0 0 0 0 5 0 0 0
## know 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## leave 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## like 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## logo 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## luckbecouse 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## mine 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## misguide 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## new 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## offered 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## option 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## ordered 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## paid 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## policy 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## price 0 0 0 0 4 0 0 0 0 1 0 0 0 0 4 0 0 0
## product 1 1 0 1 0 1 0 0 0 4 1 1 0 1 0 1 0 0
## promise 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## purchasing 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## pushing 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## read 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## received 0 0 0 0 0 1 0 0 0 2 0 0 0 0 0 1 0 0
## receivedbut 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## repair 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## repaired 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0
## replacedthat 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## replacement 0 0 0 0 0 0 0 0 0 5 0 0 0 0 0 0 0 0
## replacementi 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## replacementnow 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## reported 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## request 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## see 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## service 0 1 0 0 2 0 0 1 0 3 0 1 0 0 2 0 0 1
## shocked 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## showing 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## stuck 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## support 0 0 0 0 1 0 0 0 0 2 0 0 0 0 1 0 0 0
## terms 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## thinking 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## told 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## took 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## tried 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## turn 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## turned 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## unfortunately 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## visit 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## warranty 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## will 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## worry 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## xvery 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## yes 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0
## average 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## better 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1 0
## camera 3 0 0 0 1 0 0 1 0 0 3 0 0 0 1 0 0 1
## charger 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## charging 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## con 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## crispy 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## display 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1
## fast 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0
## fully 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## great 2 0 0 0 3 0 0 0 0 0 2 0 0 0 3 0 0 0
## hour 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## included 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## mins 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## much 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## oneplus 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## opt 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## really 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0
## samsung 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0
## satisfied 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0 0
## takes 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0
## deliveredhighly 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## excellent 0 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0
## well 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0
## deal 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## awesome 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## delivery 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## equally 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## absurd 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## almost 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## annoying 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## another 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## anything 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## argue 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## ask 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## aspect 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## available 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## beautiful 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## benefits 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## best 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0
## biggest 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## bionic 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## bracket 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## break 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## came 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## chip 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0
## class 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## comes 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## coming 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## compared 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1 0
## connected 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## cons 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## considering 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## continue 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## convenient 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## converted 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## coupled 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## created 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## currently 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## debatable 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## depending 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## design 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## detailssimilar 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## devices 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0
## discuss 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## dollars 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## done 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## dont 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## dot 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## ecosystem 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## else 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## even 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## ever 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## every 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## everything 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## face 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## faceid 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## faster 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## feature 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## features 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## first 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## galaxy 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## giver 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## going 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## good 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1
## gorgeous 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## greatly 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## hardware 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## high 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## huawei 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## image 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## increased 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## india 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## indian 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## interface 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## ios 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## issues 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## itconslets 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## job 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## kind 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## later 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## latest 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## left 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## less 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## let 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## love 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## makes 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## market 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## mean 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## meaning 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## mind 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## natural 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## nobody 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## nolets 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## notch 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## notifications 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## one 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## optimized 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## overshadows 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## packagepros 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## packed 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## par 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## phones 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## phonesconclusion 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## point 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## powerful 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## present 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## pro 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## process 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## projection 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## pros 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## provides 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## purchase 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## quality 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1
## released 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## rupees 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## sales 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## screen 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1 0
## secure 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## selling 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## significantly 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## simplistic 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## size 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1 0
## slow 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## smaller 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## smartphone 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0
## smartphones 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## snapdragon 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## software 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## space 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## stay 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## step 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## still 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## storage 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## sums 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## time 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## two 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## unlike 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## unlocking 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## updates 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## upto 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## user 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## whats 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## whatsoever 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## deny 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## faulty 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## replace 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## battery 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## bigger 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## hold 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## iphonex 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## life 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## plus 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## premium 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## small 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## also 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## amazing 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## appario 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## day 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## fantastic 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## fantasticsuperb 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## offers 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## overs 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## performance 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## prime 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## saved 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## thank 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## ufd 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## Docs
## Terms 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57
## accept 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## amazon 0 4 0 1 0 0 0 1 0 2 0 4 0 1 0 0 0 1
## apple 0 6 0 0 0 0 7 0 0 0 0 6 0 0 0 0 7 0
## apples 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## apply 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## bought 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## box 0 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0
## brand 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## can 0 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0
## case 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## center 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## centre 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## choice 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## conditions 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## create 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## customer 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## customers 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## days 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## defective 0 5 0 0 0 0 0 0 0 0 0 5 0 0 0 0 0 0
## device 0 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0
## disappointed 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## easily 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ends 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## full 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## get 0 4 0 0 0 0 1 0 0 0 0 4 0 0 0 0 1 0
## immediately 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## informationthere 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## insidei 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## iphone 0 3 1 0 0 0 0 0 1 0 0 3 1 0 0 0 0 0
## issue 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## just 0 4 0 0 0 0 5 0 0 0 0 4 0 0 0 0 5 0
## know 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## leave 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## like 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## logo 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## luckbecouse 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## mine 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## misguide 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## new 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## offered 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## option 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ordered 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## paid 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## policy 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## price 0 1 0 0 0 0 4 0 0 0 0 1 0 0 0 0 4 0
## product 0 4 1 1 0 1 0 1 0 0 0 4 1 1 0 1 0 1
## promise 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## purchasing 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## pushing 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## read 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## received 0 2 0 0 0 0 0 1 0 0 0 2 0 0 0 0 0 1
## receivedbut 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## repair 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## repaired 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## replacedthat 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## replacement 0 5 0 0 0 0 0 0 0 0 0 5 0 0 0 0 0 0
## replacementi 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## replacementnow 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## reported 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## request 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## see 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## service 0 3 0 1 0 0 2 0 0 1 0 3 0 1 0 0 2 0
## shocked 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## showing 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## stuck 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## support 0 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0 1 0
## terms 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## thinking 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## told 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## took 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## tried 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## turn 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## turned 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## unfortunately 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## visit 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## warranty 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## will 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## worry 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## xvery 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## yes 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## average 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## better 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0
## camera 0 0 3 0 0 0 1 0 0 1 0 0 3 0 0 0 1 0
## charger 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## charging 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## con 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## crispy 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## display 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0
## fast 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0
## fully 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## great 0 0 2 0 0 0 3 0 0 0 0 0 2 0 0 0 3 0
## hour 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## included 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## mins 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## much 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## oneplus 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## opt 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## really 0 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0
## samsung 0 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0
## satisfied 0 0 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0
## takes 0 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0
## deliveredhighly 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## excellent 0 0 0 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0
## well 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0
## deal 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## awesome 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## delivery 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## equally 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## absurd 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## almost 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## annoying 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## another 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## anything 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## argue 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ask 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## aspect 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## available 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## beautiful 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## benefits 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## best 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0
## biggest 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## bionic 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## bracket 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## break 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## came 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## chip 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0
## class 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## comes 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## coming 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## compared 0 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0
## connected 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## cons 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## considering 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## continue 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## convenient 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## converted 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## coupled 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## created 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## currently 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## debatable 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## depending 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## design 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## detailssimilar 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## devices 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0
## discuss 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## dollars 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## done 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## dont 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## dot 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ecosystem 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## else 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## even 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ever 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## every 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## everything 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## face 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## faceid 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## faster 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## feature 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## features 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## first 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## galaxy 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## giver 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## going 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## good 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0
## gorgeous 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## greatly 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## hardware 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## high 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## huawei 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## image 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## increased 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## india 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## indian 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## interface 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ios 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## issues 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## itconslets 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## job 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## kind 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## later 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## latest 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## left 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## less 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## let 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## love 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## makes 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## market 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## mean 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## meaning 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## mind 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## natural 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## nobody 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## nolets 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## notch 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## notifications 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## one 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## optimized 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## overshadows 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## packagepros 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## packed 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## par 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## phones 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## phonesconclusion 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## point 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## powerful 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## present 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## pro 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## process 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## projection 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## pros 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## provides 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## purchase 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## quality 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0
## released 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## rupees 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## sales 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## screen 0 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0
## secure 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## selling 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## significantly 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## simplistic 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## size 0 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0 1 0
## slow 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## smaller 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## smartphone 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0
## smartphones 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## snapdragon 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## software 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## space 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## stay 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## step 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## still 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## storage 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## sums 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## time 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## two 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## unlike 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## unlocking 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## updates 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## upto 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## user 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## whats 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## whatsoever 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## deny 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## faulty 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## replace 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## battery 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## bigger 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## hold 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## iphonex 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## life 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## plus 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## premium 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## small 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## also 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## amazing 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## appario 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## day 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## fantastic 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## fantasticsuperb 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## offers 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## overs 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## performance 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## prime 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## saved 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## thank 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## ufd 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## Docs
## Terms 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 73 74 75
## accept 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0
## amazon 0 2 0 4 0 1 0 0 0 1 0 2 0 4 0 1 0 0
## apple 0 0 0 6 0 0 0 0 7 0 0 0 0 6 0 0 0 0
## apples 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## apply 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## bought 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## box 0 0 0 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0
## brand 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## can 0 0 0 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0
## case 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## center 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## centre 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## choice 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## conditions 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## create 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## customer 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0
## customers 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## days 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## defective 0 0 0 5 0 0 0 0 0 0 0 0 0 5 0 0 0 0
## device 0 0 0 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0
## disappointed 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## easily 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## ends 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## full 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## get 0 0 0 4 0 0 0 0 1 0 0 0 0 4 0 0 0 0
## immediately 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## informationthere 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## insidei 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## iphone 1 0 0 3 1 0 0 0 0 0 1 0 0 3 1 0 0 0
## issue 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## just 0 0 0 4 0 0 0 0 5 0 0 0 0 4 0 0 0 0
## know 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## leave 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## like 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## logo 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## luckbecouse 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## mine 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## misguide 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## new 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## offered 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## option 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## ordered 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## paid 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## policy 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## price 0 0 0 1 0 0 0 0 4 0 0 0 0 1 0 0 0 0
## product 0 0 0 4 1 1 0 1 0 1 0 0 0 4 1 1 0 1
## promise 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## purchasing 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## pushing 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## read 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## received 0 0 0 2 0 0 0 0 0 1 0 0 0 2 0 0 0 0
## receivedbut 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## repair 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## repaired 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0
## replacedthat 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## replacement 0 0 0 5 0 0 0 0 0 0 0 0 0 5 0 0 0 0
## replacementi 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## replacementnow 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## reported 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## request 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## see 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## service 0 1 0 3 0 1 0 0 2 0 0 1 0 3 0 1 0 0
## shocked 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## showing 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## stuck 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## support 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0
## terms 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## thinking 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## told 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## took 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## tried 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## turn 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## turned 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## unfortunately 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## visit 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## warranty 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## will 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## worry 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## xvery 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## yes 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0
## average 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## better 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0 0
## camera 0 1 0 0 3 0 0 0 1 0 0 1 0 0 3 0 0 0
## charger 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## charging 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## con 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## crispy 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## display 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0
## fast 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1
## fully 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## great 0 0 0 0 2 0 0 0 3 0 0 0 0 0 2 0 0 0
## hour 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## included 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## mins 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## much 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## oneplus 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## opt 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## really 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0
## samsung 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0
## satisfied 0 0 0 0 1 1 0 0 0 0 0 0 0 0 1 1 0 0
## takes 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0
## deliveredhighly 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## excellent 0 0 0 0 0 1 1 0 0 0 0 0 0 0 0 1 1 0
## well 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0
## deal 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## awesome 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## delivery 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## equally 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## absurd 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## almost 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## annoying 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## another 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## anything 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## argue 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## ask 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## aspect 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## available 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## beautiful 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## benefits 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## best 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0
## biggest 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## bionic 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## bracket 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## break 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## came 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## chip 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0
## class 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## comes 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## coming 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## compared 1 0 0 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0
## connected 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## cons 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## considering 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## continue 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## convenient 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## converted 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## coupled 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## created 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## currently 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## debatable 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## depending 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## design 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## detailssimilar 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## devices 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0
## discuss 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## dollars 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## done 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## dont 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## dot 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## ecosystem 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## else 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## even 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## ever 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## every 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## everything 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## face 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## faceid 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## faster 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## feature 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## features 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## first 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## galaxy 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## giver 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## going 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## good 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0
## gorgeous 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## greatly 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## hardware 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## high 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## huawei 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## image 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## increased 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## india 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## indian 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## interface 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## ios 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## issues 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## itconslets 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## job 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## kind 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## later 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## latest 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## left 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## less 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## let 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## love 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## makes 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## market 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## mean 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## meaning 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## mind 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## natural 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## nobody 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## nolets 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## notch 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## notifications 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## one 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## optimized 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## overshadows 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## packagepros 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## packed 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## par 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## phones 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## phonesconclusion 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## point 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## powerful 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## present 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## pro 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## process 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## projection 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## pros 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## provides 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## purchase 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## quality 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0
## released 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## rupees 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## sales 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## screen 1 0 0 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0
## secure 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## selling 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## significantly 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## simplistic 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## size 1 0 0 0 0 0 0 0 1 0 1 0 0 0 0 0 0 0
## slow 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## smaller 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## smartphone 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0
## smartphones 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## snapdragon 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## software 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## space 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## stay 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## step 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## still 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## storage 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## sums 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## time 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## two 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## unlike 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## unlocking 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## updates 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## upto 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## user 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## whats 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## whatsoever 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## deny 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## faulty 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## replace 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## battery 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## bigger 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## hold 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## iphonex 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## life 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## plus 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## premium 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## small 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## also 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## amazing 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## appario 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## day 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## fantastic 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## fantasticsuperb 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## offers 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## overs 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## performance 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## prime 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## saved 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## thank 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ufd 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## Docs
## Terms 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 91 92 93
## accept 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## amazon 0 1 0 2 0 4 0 1 0 0 0 1 0 2 0 4 0 1
## apple 7 0 0 0 0 6 0 0 0 0 7 0 0 0 0 6 0 0
## apples 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## apply 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## bought 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## box 0 0 0 0 0 1 1 0 0 0 0 0 0 0 0 1 1 0
## brand 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## can 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0 1 0 0
## case 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## center 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## centre 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## choice 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## conditions 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## create 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## customer 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## customers 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## days 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## defective 0 0 0 0 0 5 0 0 0 0 0 0 0 0 0 5 0 0
## device 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0 1 0 0
## disappointed 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## easily 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ends 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## full 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## get 1 0 0 0 0 4 0 0 0 0 1 0 0 0 0 4 0 0
## immediately 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## informationthere 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## insidei 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## iphone 0 0 1 0 0 3 1 0 0 0 0 0 1 0 0 3 1 0
## issue 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## just 5 0 0 0 0 4 0 0 0 0 5 0 0 0 0 4 0 0
## know 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## leave 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## like 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## logo 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## luckbecouse 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## mine 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## misguide 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## new 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## offered 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## option 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ordered 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## paid 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## policy 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## price 4 0 0 0 0 1 0 0 0 0 4 0 0 0 0 1 0 0
## product 0 1 0 0 0 4 1 1 0 1 0 1 0 0 0 4 1 1
## promise 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## purchasing 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## pushing 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## read 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## received 0 1 0 0 0 2 0 0 0 0 0 1 0 0 0 2 0 0
## receivedbut 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## repair 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## repaired 0 0 0 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## replacedthat 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## replacement 0 0 0 0 0 5 0 0 0 0 0 0 0 0 0 5 0 0
## replacementi 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## replacementnow 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## reported 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## request 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## see 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## service 2 0 0 1 0 3 0 1 0 0 2 0 0 1 0 3 0 1
## shocked 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## showing 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## stuck 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## support 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0
## terms 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## thinking 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## told 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## took 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## tried 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## turn 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## turned 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## unfortunately 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## visit 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## warranty 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## will 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## worry 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## xvery 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## yes 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## average 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## better 0 0 1 0 0 0 1 0 0 0 0 0 1 0 0 0 1 0
## camera 1 0 0 1 0 0 3 0 0 0 1 0 0 1 0 0 3 0
## charger 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## charging 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## con 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## crispy 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## display 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0
## fast 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1 0
## fully 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## great 3 0 0 0 0 0 2 0 0 0 3 0 0 0 0 0 2 0
## hour 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## included 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## mins 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## much 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## oneplus 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## opt 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## really 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1 0
## samsung 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1 0
## satisfied 0 0 0 0 0 0 1 1 0 0 0 0 0 0 0 0 1 1
## takes 1 0 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1 0
## deliveredhighly 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## excellent 0 0 0 0 0 0 0 1 1 0 0 0 0 0 0 0 0 1
## well 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0 1
## deal 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## awesome 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## delivery 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## equally 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## absurd 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## almost 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## annoying 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## another 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## anything 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## argue 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ask 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## aspect 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## available 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## beautiful 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## benefits 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## best 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0
## biggest 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## bionic 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## bracket 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## break 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## came 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## chip 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0
## class 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## comes 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## coming 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## compared 1 0 1 0 0 0 0 0 0 0 1 0 1 0 0 0 0 0
## connected 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## cons 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## considering 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## continue 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## convenient 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## converted 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## coupled 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## created 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## currently 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## debatable 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## depending 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## design 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## detailssimilar 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## devices 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0
## discuss 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## dollars 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## done 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## dont 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## dot 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ecosystem 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## else 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## even 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ever 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## every 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## everything 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## face 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## faceid 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## faster 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## feature 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## features 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## first 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## galaxy 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## giver 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## going 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## good 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0
## gorgeous 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## greatly 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## hardware 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## high 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## huawei 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## image 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## increased 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## india 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## indian 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## interface 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ios 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## issues 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## itconslets 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## job 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## kind 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## later 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## latest 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## left 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## less 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## let 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## love 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## makes 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## market 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## mean 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## meaning 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## mind 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## natural 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## nobody 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## nolets 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## notch 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## notifications 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## one 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## optimized 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## overshadows 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## packagepros 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## packed 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## par 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## phones 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## phonesconclusion 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## point 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## powerful 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## present 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## pro 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## process 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## projection 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## pros 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## provides 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## purchase 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## quality 1 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0 0
## released 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## rupees 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## sales 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## screen 1 0 1 0 0 0 0 0 0 0 1 0 1 0 0 0 0 0
## secure 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## selling 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## significantly 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## simplistic 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## size 1 0 1 0 0 0 0 0 0 0 1 0 1 0 0 0 0 0
## slow 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## smaller 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## smartphone 3 0 0 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0
## smartphones 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## snapdragon 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## software 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## space 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## stay 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## step 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## still 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## storage 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## sums 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## time 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## two 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## unlike 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## unlocking 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## updates 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## upto 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## user 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## whats 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## whatsoever 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## deny 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## faulty 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## replace 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## battery 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## bigger 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## hold 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## iphonex 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## life 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## plus 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## premium 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## small 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## also 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## amazing 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## appario 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## day 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## fantastic 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## fantasticsuperb 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## offers 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## overs 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## performance 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## prime 0 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## saved 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## thank 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## ufd 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## Docs
## Terms 94 95 96 97 98 99 100 101 102 103 104 105 106 107 108
## accept 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## amazon 0 0 0 1 0 2 0 4 0 1 0 0 0 1 0
## apple 0 0 7 0 0 0 0 6 0 0 0 0 7 0 0
## apples 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## apply 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## bought 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## box 0 0 0 0 0 0 0 1 1 0 0 0 0 0 0
## brand 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## can 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0
## case 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## center 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## centre 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## choice 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## conditions 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## create 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## customer 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## customers 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## days 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## defective 0 0 0 0 0 0 0 5 0 0 0 0 0 0 0
## device 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0
## disappointed 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## easily 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ends 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## full 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## get 0 0 1 0 0 0 0 4 0 0 0 0 1 0 0
## immediately 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## informationthere 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## insidei 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## iphone 0 0 0 0 1 0 0 3 1 0 0 0 0 0 1
## issue 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## just 0 0 5 0 0 0 0 4 0 0 0 0 5 0 0
## know 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## leave 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## like 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## logo 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## luckbecouse 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## mine 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## misguide 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## new 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## offered 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## option 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ordered 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## paid 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## policy 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## price 0 0 4 0 0 0 0 1 0 0 0 0 4 0 0
## product 0 1 0 1 0 0 0 4 1 1 0 1 0 1 0
## promise 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## purchasing 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## pushing 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## read 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## received 0 0 0 1 0 0 0 2 0 0 0 0 0 1 0
## receivedbut 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## repair 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## repaired 0 0 0 0 0 0 0 3 0 0 0 0 0 0 0
## replacedthat 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## replacement 0 0 0 0 0 0 0 5 0 0 0 0 0 0 0
## replacementi 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## replacementnow 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## reported 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## request 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## see 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## service 0 0 2 0 0 1 0 3 0 1 0 0 2 0 0
## shocked 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## showing 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## stuck 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## support 0 0 1 0 0 0 0 2 0 0 0 0 1 0 0
## terms 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## thinking 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## told 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## took 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## tried 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## turn 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## turned 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## unfortunately 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## visit 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## warranty 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## will 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## worry 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## xvery 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## yes 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## average 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## better 0 0 0 0 1 0 0 0 1 0 0 0 0 0 1
## camera 0 0 1 0 0 1 0 0 3 0 0 0 1 0 0
## charger 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## charging 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## con 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## crispy 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## display 0 0 0 0 0 1 0 0 1 0 0 0 0 0 0
## fast 0 1 0 0 0 0 0 0 1 0 0 1 0 0 0
## fully 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## great 0 0 3 0 0 0 0 0 2 0 0 0 3 0 0
## hour 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## included 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## mins 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## much 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## oneplus 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## opt 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## really 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0
## samsung 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0
## satisfied 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0
## takes 0 0 1 0 0 0 0 0 1 0 0 0 1 0 0
## deliveredhighly 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## excellent 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0
## well 0 0 1 0 0 0 0 0 0 1 0 0 1 0 0
## deal 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## awesome 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## delivery 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## equally 0 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## absurd 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## almost 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## annoying 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## another 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## anything 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## argue 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ask 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## aspect 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## available 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## beautiful 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## benefits 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## best 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## biggest 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## bionic 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## bracket 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## break 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## came 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## chip 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## class 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## comes 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## coming 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## compared 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1
## connected 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## cons 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## considering 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## continue 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## convenient 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## converted 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## coupled 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## created 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## currently 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## debatable 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## depending 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## design 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## detailssimilar 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## devices 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## discuss 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## dollars 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## done 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## dont 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## dot 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ecosystem 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## else 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## even 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ever 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## every 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## everything 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## face 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## faceid 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## faster 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## feature 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## features 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## first 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## galaxy 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## giver 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## going 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## good 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0
## gorgeous 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## greatly 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## hardware 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## high 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## huawei 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## image 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## increased 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## india 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## indian 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## interface 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ios 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## issues 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## itconslets 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## job 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## kind 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## later 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## latest 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## left 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## less 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## let 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## love 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## makes 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## market 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## mean 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## meaning 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## mind 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## natural 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## nobody 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## nolets 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## notch 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## notifications 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## one 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## optimized 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## overshadows 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## packagepros 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## packed 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## par 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## phones 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## phonesconclusion 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## point 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## powerful 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## present 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## pro 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## process 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## projection 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## pros 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## provides 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## purchase 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## quality 0 0 1 0 0 1 0 0 0 0 0 0 1 0 0
## released 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## rupees 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## sales 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## screen 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1
## secure 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## selling 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## significantly 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## simplistic 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## size 0 0 1 0 1 0 0 0 0 0 0 0 1 0 1
## slow 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## smaller 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## smartphone 0 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## smartphones 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## snapdragon 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## software 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## space 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## stay 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## step 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## still 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## storage 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## sums 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## time 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## two 0 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## unlike 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## unlocking 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## updates 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## upto 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## user 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## whats 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## whatsoever 0 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## deny 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## faulty 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## replace 0 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## battery 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## bigger 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## hold 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## iphonex 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## life 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## plus 0 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## premium 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## small 0 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## also 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## amazing 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## appario 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## day 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## fantastic 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## fantasticsuperb 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## offers 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## overs 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## performance 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## prime 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## saved 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## thank 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## ufd 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## Docs
## Terms 109 110 111 112 113 114 115 116 117 118 119 120 121 122
## accept 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## amazon 2 0 4 0 1 0 0 0 1 0 2 0 4 0
## apple 0 0 6 0 0 0 0 7 0 0 0 0 6 0
## apples 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## apply 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## bought 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## box 0 0 1 1 0 0 0 0 0 0 0 0 1 1
## brand 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## can 0 0 1 0 0 0 0 2 0 0 0 0 1 0
## case 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## center 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## centre 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## choice 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## conditions 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## create 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## customer 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## customers 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## days 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## defective 0 0 5 0 0 0 0 0 0 0 0 0 5 0
## device 0 0 1 0 0 0 0 2 0 0 0 0 1 0
## disappointed 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## easily 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ends 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## full 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## get 0 0 4 0 0 0 0 1 0 0 0 0 4 0
## immediately 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## informationthere 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## insidei 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## iphone 0 0 3 1 0 0 0 0 0 1 0 0 3 1
## issue 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## just 0 0 4 0 0 0 0 5 0 0 0 0 4 0
## know 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## leave 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## like 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## logo 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## luckbecouse 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## mine 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## misguide 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## new 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## offered 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## option 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ordered 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## paid 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## policy 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## price 0 0 1 0 0 0 0 4 0 0 0 0 1 0
## product 0 0 4 1 1 0 1 0 1 0 0 0 4 1
## promise 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## purchasing 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## pushing 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## read 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## received 0 0 2 0 0 0 0 0 1 0 0 0 2 0
## receivedbut 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## repair 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## repaired 0 0 3 0 0 0 0 0 0 0 0 0 3 0
## replacedthat 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## replacement 0 0 5 0 0 0 0 0 0 0 0 0 5 0
## replacementi 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## replacementnow 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## reported 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## request 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## see 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## service 1 0 3 0 1 0 0 2 0 0 1 0 3 0
## shocked 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## showing 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## stuck 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## support 0 0 2 0 0 0 0 1 0 0 0 0 2 0
## terms 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## thinking 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## told 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## took 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## tried 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## turn 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## turned 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## unfortunately 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## visit 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## warranty 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## will 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## worry 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## xvery 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## yes 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## average 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## better 0 0 0 1 0 0 0 0 0 1 0 0 0 1
## camera 1 0 0 3 0 0 0 1 0 0 1 0 0 3
## charger 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## charging 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## con 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## crispy 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## display 1 0 0 1 0 0 0 0 0 0 1 0 0 1
## fast 0 0 0 1 0 0 1 0 0 0 0 0 0 1
## fully 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## great 0 0 0 2 0 0 0 3 0 0 0 0 0 2
## hour 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## included 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## mins 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## much 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## oneplus 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## opt 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## really 0 0 0 1 0 0 0 1 0 0 0 0 0 1
## samsung 0 0 0 1 0 0 0 1 0 0 0 0 0 1
## satisfied 0 0 0 1 1 0 0 0 0 0 0 0 0 1
## takes 0 0 0 1 0 0 0 1 0 0 0 0 0 1
## deliveredhighly 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## excellent 0 0 0 0 1 1 0 0 0 0 0 0 0 0
## well 0 0 0 0 1 0 0 1 0 0 0 0 0 0
## deal 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## awesome 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## delivery 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## equally 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## absurd 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## almost 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## annoying 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## another 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## anything 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## argue 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ask 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## aspect 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## available 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## beautiful 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## benefits 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## best 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## biggest 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## bionic 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## bracket 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## break 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## came 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## chip 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## class 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## comes 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## coming 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## compared 0 0 0 0 0 0 0 1 0 1 0 0 0 0
## connected 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## cons 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## considering 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## continue 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## convenient 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## converted 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## coupled 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## created 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## currently 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## debatable 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## depending 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## design 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## detailssimilar 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## devices 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## discuss 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## dollars 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## done 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## dont 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## dot 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ecosystem 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## else 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## even 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ever 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## every 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## everything 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## face 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## faceid 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## faster 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## feature 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## features 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## first 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## galaxy 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## giver 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## going 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## good 1 0 0 0 0 0 0 1 0 0 1 0 0 0
## gorgeous 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## greatly 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## hardware 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## high 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## huawei 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## image 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## increased 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## india 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## indian 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## interface 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ios 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## issues 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## itconslets 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## job 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## kind 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## later 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## latest 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## left 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## less 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## let 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## love 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## makes 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## market 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## mean 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## meaning 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## mind 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## natural 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## nobody 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## nolets 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## notch 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## notifications 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## one 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## optimized 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## overshadows 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## packagepros 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## packed 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## par 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## phones 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## phonesconclusion 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## point 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## powerful 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## present 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## pro 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## process 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## projection 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## pros 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## provides 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## purchase 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## quality 1 0 0 0 0 0 0 1 0 0 1 0 0 0
## released 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## rupees 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## sales 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## screen 0 0 0 0 0 0 0 1 0 1 0 0 0 0
## secure 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## selling 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## significantly 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## simplistic 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## size 0 0 0 0 0 0 0 1 0 1 0 0 0 0
## slow 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## smaller 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## smartphone 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## smartphones 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## snapdragon 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## software 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## space 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## stay 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## step 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## still 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## storage 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## sums 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## time 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## two 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## unlike 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## unlocking 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## updates 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## upto 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## user 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## whats 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## whatsoever 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## deny 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## faulty 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## replace 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## battery 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## bigger 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## hold 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## iphonex 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## life 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## plus 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## premium 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## small 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## also 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## amazing 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## appario 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## day 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## fantastic 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## fantasticsuperb 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## offers 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## overs 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## performance 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## prime 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## saved 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## thank 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## ufd 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## Docs
## Terms 123 124 125 126 127 128 129 130 131 132 133 134 135 136
## accept 0 0 0 1 0 0 0 0 1 0 0 0 0 1
## amazon 1 0 0 0 1 0 2 0 4 0 1 0 0 0
## apple 0 0 0 7 0 0 0 0 6 0 0 0 0 7
## apples 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## apply 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## bought 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## box 0 0 0 0 0 0 0 0 1 1 0 0 0 0
## brand 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## can 0 0 0 2 0 0 0 0 1 0 0 0 0 2
## case 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## center 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## centre 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## choice 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## conditions 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## create 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## customer 0 0 0 1 0 0 0 0 1 0 0 0 0 1
## customers 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## days 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## defective 0 0 0 0 0 0 0 0 5 0 0 0 0 0
## device 0 0 0 2 0 0 0 0 1 0 0 0 0 2
## disappointed 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## easily 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## ends 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## full 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## get 0 0 0 1 0 0 0 0 4 0 0 0 0 1
## immediately 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## informationthere 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## insidei 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## iphone 0 0 0 0 0 1 0 0 3 1 0 0 0 0
## issue 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## just 0 0 0 5 0 0 0 0 4 0 0 0 0 5
## know 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## leave 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## like 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## logo 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## luckbecouse 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## mine 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## misguide 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## new 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## offered 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## option 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## ordered 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## paid 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## policy 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## price 0 0 0 4 0 0 0 0 1 0 0 0 0 4
## product 1 0 1 0 1 0 0 0 4 1 1 0 1 0
## promise 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## purchasing 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## pushing 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## read 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## received 0 0 0 0 1 0 0 0 2 0 0 0 0 0
## receivedbut 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## repair 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## repaired 0 0 0 0 0 0 0 0 3 0 0 0 0 0
## replacedthat 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## replacement 0 0 0 0 0 0 0 0 5 0 0 0 0 0
## replacementi 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## replacementnow 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## reported 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## request 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## see 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## service 1 0 0 2 0 0 1 0 3 0 1 0 0 2
## shocked 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## showing 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## stuck 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## support 0 0 0 1 0 0 0 0 2 0 0 0 0 1
## terms 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## thinking 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## told 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## took 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## tried 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## turn 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## turned 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## unfortunately 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## visit 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## warranty 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## will 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## worry 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## xvery 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## yes 0 0 0 1 0 0 0 0 1 0 0 0 0 1
## average 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## better 0 0 0 0 0 1 0 0 0 1 0 0 0 0
## camera 0 0 0 1 0 0 1 0 0 3 0 0 0 1
## charger 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## charging 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## con 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## crispy 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## display 0 0 0 0 0 0 1 0 0 1 0 0 0 0
## fast 0 0 1 0 0 0 0 0 0 1 0 0 1 0
## fully 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## great 0 0 0 3 0 0 0 0 0 2 0 0 0 3
## hour 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## included 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## mins 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## much 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## oneplus 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## opt 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## really 0 0 0 1 0 0 0 0 0 1 0 0 0 1
## samsung 0 0 0 1 0 0 0 0 0 1 0 0 0 1
## satisfied 1 0 0 0 0 0 0 0 0 1 1 0 0 0
## takes 0 0 0 1 0 0 0 0 0 1 0 0 0 1
## deliveredhighly 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## excellent 1 1 0 0 0 0 0 0 0 0 1 1 0 0
## well 1 0 0 1 0 0 0 0 0 0 1 0 0 1
## deal 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## awesome 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## delivery 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## equally 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## absurd 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## almost 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## annoying 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## another 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## anything 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## argue 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## ask 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## aspect 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## available 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## beautiful 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## benefits 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## best 0 0 0 3 0 0 0 0 0 0 0 0 0 3
## biggest 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## bionic 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## bracket 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## break 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## came 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## chip 0 0 0 3 0 0 0 0 0 0 0 0 0 3
## class 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## comes 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## coming 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## compared 0 0 0 1 0 1 0 0 0 0 0 0 0 1
## connected 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## cons 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## considering 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## continue 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## convenient 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## converted 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## coupled 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## created 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## currently 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## debatable 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## depending 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## design 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## detailssimilar 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## devices 0 0 0 3 0 0 0 0 0 0 0 0 0 3
## discuss 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## dollars 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## done 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## dont 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## dot 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## ecosystem 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## else 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## even 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## ever 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## every 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## everything 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## face 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## faceid 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## faster 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## feature 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## features 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## first 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## galaxy 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## giver 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## going 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## good 0 0 0 1 0 0 1 0 0 0 0 0 0 1
## gorgeous 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## greatly 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## hardware 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## high 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## huawei 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## image 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## increased 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## india 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## indian 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## interface 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## ios 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## issues 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## itconslets 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## job 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## kind 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## later 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## latest 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## left 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## less 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## let 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## love 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## makes 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## market 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## mean 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## meaning 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## mind 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## natural 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## nobody 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## nolets 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## notch 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## notifications 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## one 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## optimized 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## overshadows 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## packagepros 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## packed 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## par 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## phones 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## phonesconclusion 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## point 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## powerful 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## present 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## pro 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## process 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## projection 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## pros 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## provides 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## purchase 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## quality 0 0 0 1 0 0 1 0 0 0 0 0 0 1
## released 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## rupees 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## sales 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## screen 0 0 0 1 0 1 0 0 0 0 0 0 0 1
## secure 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## selling 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## significantly 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## simplistic 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## size 0 0 0 1 0 1 0 0 0 0 0 0 0 1
## slow 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## smaller 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## smartphone 0 0 0 3 0 0 0 0 0 0 0 0 0 3
## smartphones 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## snapdragon 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## software 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## space 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## stay 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## step 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## still 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## storage 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## sums 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## time 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## two 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## unlike 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## unlocking 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## updates 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## upto 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## user 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## whats 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## whatsoever 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## deny 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## faulty 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## replace 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## battery 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## bigger 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## hold 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## iphonex 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## life 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## plus 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## premium 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## small 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## also 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## amazing 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## appario 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## day 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## fantastic 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## fantasticsuperb 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## offers 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## overs 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## performance 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## prime 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## saved 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## thank 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ufd 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## Docs
## Terms 137 138 139 140 141 142 143 144 145 146 147 148 149 150
## accept 0 0 0 0 1 0 0 0 0 1 0 0 0 0
## amazon 1 0 2 0 4 0 1 0 0 0 1 0 2 0
## apple 0 0 0 0 6 0 0 0 0 7 0 0 0 0
## apples 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## apply 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## bought 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## box 0 0 0 0 1 1 0 0 0 0 0 0 0 0
## brand 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## can 0 0 0 0 1 0 0 0 0 2 0 0 0 0
## case 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## center 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## centre 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## choice 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## conditions 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## create 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## customer 0 0 0 0 1 0 0 0 0 1 0 0 0 0
## customers 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## days 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## defective 0 0 0 0 5 0 0 0 0 0 0 0 0 0
## device 0 0 0 0 1 0 0 0 0 2 0 0 0 0
## disappointed 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## easily 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## ends 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## full 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## get 0 0 0 0 4 0 0 0 0 1 0 0 0 0
## immediately 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## informationthere 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## insidei 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## iphone 0 1 0 0 3 1 0 0 0 0 0 1 0 0
## issue 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## just 0 0 0 0 4 0 0 0 0 5 0 0 0 0
## know 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## leave 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## like 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## logo 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## luckbecouse 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## mine 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## misguide 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## new 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## offered 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## option 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## ordered 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## paid 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## policy 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## price 0 0 0 0 1 0 0 0 0 4 0 0 0 0
## product 1 0 0 0 4 1 1 0 1 0 1 0 0 0
## promise 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## purchasing 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## pushing 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## read 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## received 1 0 0 0 2 0 0 0 0 0 1 0 0 0
## receivedbut 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## repair 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## repaired 0 0 0 0 3 0 0 0 0 0 0 0 0 0
## replacedthat 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## replacement 0 0 0 0 5 0 0 0 0 0 0 0 0 0
## replacementi 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## replacementnow 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## reported 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## request 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## see 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## service 0 0 1 0 3 0 1 0 0 2 0 0 1 0
## shocked 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## showing 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## stuck 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## support 0 0 0 0 2 0 0 0 0 1 0 0 0 0
## terms 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## thinking 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## told 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## took 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## tried 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## turn 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## turned 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## unfortunately 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## visit 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## warranty 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## will 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## worry 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## xvery 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## yes 0 0 0 0 1 0 0 0 0 1 0 0 0 0
## average 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## better 0 1 0 0 0 1 0 0 0 0 0 1 0 0
## camera 0 0 1 0 0 3 0 0 0 1 0 0 1 0
## charger 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## charging 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## con 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## crispy 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## display 0 0 1 0 0 1 0 0 0 0 0 0 1 0
## fast 0 0 0 0 0 1 0 0 1 0 0 0 0 0
## fully 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## great 0 0 0 0 0 2 0 0 0 3 0 0 0 0
## hour 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## included 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## mins 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## much 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## oneplus 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## opt 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## really 0 0 0 0 0 1 0 0 0 1 0 0 0 0
## samsung 0 0 0 0 0 1 0 0 0 1 0 0 0 0
## satisfied 0 0 0 0 0 1 1 0 0 0 0 0 0 0
## takes 0 0 0 0 0 1 0 0 0 1 0 0 0 0
## deliveredhighly 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## excellent 0 0 0 0 0 0 1 1 0 0 0 0 0 0
## well 0 0 0 0 0 0 1 0 0 1 0 0 0 0
## deal 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## awesome 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## delivery 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## equally 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## absurd 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## almost 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## annoying 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## another 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## anything 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## argue 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## ask 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## aspect 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## available 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## beautiful 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## benefits 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## best 0 0 0 0 0 0 0 0 0 3 0 0 0 0
## biggest 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## bionic 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## bracket 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## break 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## came 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## chip 0 0 0 0 0 0 0 0 0 3 0 0 0 0
## class 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## comes 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## coming 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## compared 0 1 0 0 0 0 0 0 0 1 0 1 0 0
## connected 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## cons 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## considering 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## continue 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## convenient 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## converted 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## coupled 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## created 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## currently 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## debatable 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## depending 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## design 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## detailssimilar 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## devices 0 0 0 0 0 0 0 0 0 3 0 0 0 0
## discuss 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## dollars 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## done 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## dont 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## dot 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## ecosystem 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## else 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## even 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## ever 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## every 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## everything 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## face 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## faceid 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## faster 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## feature 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## features 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## first 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## galaxy 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## giver 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## going 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## good 0 0 1 0 0 0 0 0 0 1 0 0 1 0
## gorgeous 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## greatly 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## hardware 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## high 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## huawei 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## image 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## increased 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## india 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## indian 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## interface 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## ios 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## issues 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## itconslets 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## job 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## kind 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## later 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## latest 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## left 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## less 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## let 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## love 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## makes 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## market 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## mean 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## meaning 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## mind 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## natural 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## nobody 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## nolets 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## notch 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## notifications 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## one 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## optimized 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## overshadows 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## packagepros 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## packed 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## par 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## phones 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## phonesconclusion 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## point 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## powerful 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## present 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## pro 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## process 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## projection 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## pros 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## provides 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## purchase 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## quality 0 0 1 0 0 0 0 0 0 1 0 0 1 0
## released 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## rupees 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## sales 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## screen 0 1 0 0 0 0 0 0 0 1 0 1 0 0
## secure 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## selling 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## significantly 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## simplistic 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## size 0 1 0 0 0 0 0 0 0 1 0 1 0 0
## slow 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## smaller 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## smartphone 0 0 0 0 0 0 0 0 0 3 0 0 0 0
## smartphones 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## snapdragon 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## software 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## space 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## stay 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## step 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## still 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## storage 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## sums 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## time 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## two 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## unlike 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## unlocking 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## updates 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## upto 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## user 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## whats 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## whatsoever 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## deny 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## faulty 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## replace 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## battery 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## bigger 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## hold 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## iphonex 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## life 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## plus 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## premium 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## small 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## also 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## amazing 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## appario 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## day 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## fantastic 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## fantasticsuperb 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## offers 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## overs 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## performance 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## prime 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## saved 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## thank 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ufd 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## Docs
## Terms 151 152 153 154 155 156 157 158 159 160 161 162 163 164
## accept 1 0 0 0 0 1 0 0 0 0 1 0 0 0
## amazon 4 0 1 0 0 0 1 0 2 0 4 0 1 0
## apple 6 0 0 0 0 7 0 0 0 0 6 0 0 0
## apples 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## apply 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## bought 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## box 1 1 0 0 0 0 0 0 0 0 1 1 0 0
## brand 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## can 1 0 0 0 0 2 0 0 0 0 1 0 0 0
## case 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## center 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## centre 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## choice 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## conditions 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## create 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## customer 1 0 0 0 0 1 0 0 0 0 1 0 0 0
## customers 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## days 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## defective 5 0 0 0 0 0 0 0 0 0 5 0 0 0
## device 1 0 0 0 0 2 0 0 0 0 1 0 0 0
## disappointed 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## easily 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## ends 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## full 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## get 4 0 0 0 0 1 0 0 0 0 4 0 0 0
## immediately 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## informationthere 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## insidei 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## iphone 3 1 0 0 0 0 0 1 0 0 3 1 0 0
## issue 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## just 4 0 0 0 0 5 0 0 0 0 4 0 0 0
## know 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## leave 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## like 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## logo 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## luckbecouse 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## mine 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## misguide 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## new 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## offered 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## option 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## ordered 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## paid 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## policy 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## price 1 0 0 0 0 4 0 0 0 0 1 0 0 0
## product 4 1 1 0 1 0 1 0 0 0 4 1 1 0
## promise 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## purchasing 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## pushing 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## read 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## received 2 0 0 0 0 0 1 0 0 0 2 0 0 0
## receivedbut 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## repair 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## repaired 3 0 0 0 0 0 0 0 0 0 3 0 0 0
## replacedthat 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## replacement 5 0 0 0 0 0 0 0 0 0 5 0 0 0
## replacementi 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## replacementnow 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## reported 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## request 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## see 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## service 3 0 1 0 0 2 0 0 1 0 3 0 1 0
## shocked 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## showing 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## stuck 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## support 2 0 0 0 0 1 0 0 0 0 2 0 0 0
## terms 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## thinking 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## told 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## took 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## tried 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## turn 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## turned 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## unfortunately 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## visit 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## warranty 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## will 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## worry 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## xvery 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## yes 1 0 0 0 0 1 0 0 0 0 1 0 0 0
## average 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## better 0 1 0 0 0 0 0 1 0 0 0 1 0 0
## camera 0 3 0 0 0 1 0 0 1 0 0 3 0 0
## charger 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## charging 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## con 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## crispy 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## display 0 1 0 0 0 0 0 0 1 0 0 1 0 0
## fast 0 1 0 0 1 0 0 0 0 0 0 1 0 0
## fully 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## great 0 2 0 0 0 3 0 0 0 0 0 2 0 0
## hour 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## included 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## mins 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## much 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## oneplus 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## opt 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## really 0 1 0 0 0 1 0 0 0 0 0 1 0 0
## samsung 0 1 0 0 0 1 0 0 0 0 0 1 0 0
## satisfied 0 1 1 0 0 0 0 0 0 0 0 1 1 0
## takes 0 1 0 0 0 1 0 0 0 0 0 1 0 0
## deliveredhighly 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## excellent 0 0 1 1 0 0 0 0 0 0 0 0 1 1
## well 0 0 1 0 0 1 0 0 0 0 0 0 1 0
## deal 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## awesome 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## delivery 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## equally 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## absurd 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## almost 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## annoying 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## another 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## anything 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## argue 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## ask 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## aspect 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## available 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## beautiful 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## benefits 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## best 0 0 0 0 0 3 0 0 0 0 0 0 0 0
## biggest 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## bionic 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## bracket 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## break 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## came 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## chip 0 0 0 0 0 3 0 0 0 0 0 0 0 0
## class 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## comes 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## coming 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## compared 0 0 0 0 0 1 0 1 0 0 0 0 0 0
## connected 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## cons 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## considering 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## continue 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## convenient 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## converted 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## coupled 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## created 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## currently 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## debatable 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## depending 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## design 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## detailssimilar 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## devices 0 0 0 0 0 3 0 0 0 0 0 0 0 0
## discuss 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## dollars 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## done 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## dont 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## dot 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## ecosystem 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## else 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## even 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## ever 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## every 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## everything 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## face 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## faceid 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## faster 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## feature 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## features 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## first 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## galaxy 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## giver 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## going 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## good 0 0 0 0 0 1 0 0 1 0 0 0 0 0
## gorgeous 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## greatly 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## hardware 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## high 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## huawei 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## image 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## increased 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## india 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## indian 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## interface 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## ios 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## issues 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## itconslets 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## job 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## kind 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## later 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## latest 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## left 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## less 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## let 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## love 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## makes 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## market 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## mean 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## meaning 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## mind 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## natural 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## nobody 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## nolets 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## notch 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## notifications 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## one 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## optimized 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## overshadows 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## packagepros 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## packed 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## par 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## phones 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## phonesconclusion 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## point 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## powerful 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## present 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## pro 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## process 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## projection 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## pros 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## provides 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## purchase 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## quality 0 0 0 0 0 1 0 0 1 0 0 0 0 0
## released 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## rupees 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## sales 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## screen 0 0 0 0 0 1 0 1 0 0 0 0 0 0
## secure 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## selling 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## significantly 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## simplistic 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## size 0 0 0 0 0 1 0 1 0 0 0 0 0 0
## slow 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## smaller 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## smartphone 0 0 0 0 0 3 0 0 0 0 0 0 0 0
## smartphones 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## snapdragon 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## software 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## space 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## stay 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## step 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## still 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## storage 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## sums 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## time 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## two 0 0 0 0 0 2 0 0 0 0 0 0 0 0
## unlike 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## unlocking 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## updates 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## upto 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## user 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## whats 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## whatsoever 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## deny 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## faulty 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## replace 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## battery 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## bigger 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## hold 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## iphonex 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## life 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## plus 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## premium 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## small 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## also 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## amazing 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## appario 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## day 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## fantastic 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## fantasticsuperb 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## offers 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## overs 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## performance 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## prime 0 0 0 0 0 0 0 0 2 0 0 0 0 0
## saved 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## thank 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## ufd 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## Docs
## Terms 165 166 167 168 169 170 171 172 173 174 175 176 177 178
## accept 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## amazon 0 0 1 0 2 0 4 0 1 0 0 0 1 0
## apple 0 7 0 0 0 0 6 0 0 0 0 7 0 0
## apples 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## apply 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## bought 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## box 0 0 0 0 0 0 1 1 0 0 0 0 0 0
## brand 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## can 0 2 0 0 0 0 1 0 0 0 0 2 0 0
## case 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## center 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## centre 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## choice 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## conditions 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## create 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## customer 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## customers 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## days 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## defective 0 0 0 0 0 0 5 0 0 0 0 0 0 0
## device 0 2 0 0 0 0 1 0 0 0 0 2 0 0
## disappointed 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## easily 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ends 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## full 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## get 0 1 0 0 0 0 4 0 0 0 0 1 0 0
## immediately 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## informationthere 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## insidei 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## iphone 0 0 0 1 0 0 3 1 0 0 0 0 0 1
## issue 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## just 0 5 0 0 0 0 4 0 0 0 0 5 0 0
## know 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## leave 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## like 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## logo 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## luckbecouse 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## mine 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## misguide 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## new 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## offered 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## option 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## ordered 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## paid 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## policy 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## price 0 4 0 0 0 0 1 0 0 0 0 4 0 0
## product 1 0 1 0 0 0 4 1 1 0 1 0 1 0
## promise 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## purchasing 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## pushing 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## read 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## received 0 0 1 0 0 0 2 0 0 0 0 0 1 0
## receivedbut 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## repair 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## repaired 0 0 0 0 0 0 3 0 0 0 0 0 0 0
## replacedthat 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## replacement 0 0 0 0 0 0 5 0 0 0 0 0 0 0
## replacementi 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## replacementnow 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## reported 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## request 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## see 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## service 0 2 0 0 1 0 3 0 1 0 0 2 0 0
## shocked 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## showing 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## stuck 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## support 0 1 0 0 0 0 2 0 0 0 0 1 0 0
## terms 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## thinking 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## told 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## took 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## tried 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## turn 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## turned 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## unfortunately 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## visit 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## warranty 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## will 0 0 0 0 0 0 2 0 0 0 0 0 0 0
## worry 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## xvery 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## yes 0 1 0 0 0 0 1 0 0 0 0 1 0 0
## average 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## better 0 0 0 1 0 0 0 1 0 0 0 0 0 1
## camera 0 1 0 0 1 0 0 3 0 0 0 1 0 0
## charger 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## charging 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## con 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## crispy 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## display 0 0 0 0 1 0 0 1 0 0 0 0 0 0
## fast 1 0 0 0 0 0 0 1 0 0 1 0 0 0
## fully 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## great 0 3 0 0 0 0 0 2 0 0 0 3 0 0
## hour 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## included 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## mins 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## much 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## oneplus 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## opt 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## really 0 1 0 0 0 0 0 1 0 0 0 1 0 0
## samsung 0 1 0 0 0 0 0 1 0 0 0 1 0 0
## satisfied 0 0 0 0 0 0 0 1 1 0 0 0 0 0
## takes 0 1 0 0 0 0 0 1 0 0 0 1 0 0
## deliveredhighly 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## excellent 0 0 0 0 0 0 0 0 1 1 0 0 0 0
## well 0 1 0 0 0 0 0 0 1 0 0 1 0 0
## deal 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## awesome 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## delivery 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## equally 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## absurd 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## almost 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## annoying 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## another 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## anything 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## argue 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ask 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## aspect 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## available 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## beautiful 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## benefits 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## best 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## biggest 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## bionic 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## bracket 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## break 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## came 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## chip 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## class 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## comes 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## coming 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## compared 0 1 0 1 0 0 0 0 0 0 0 1 0 1
## connected 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## cons 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## considering 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## continue 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## convenient 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## converted 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## coupled 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## created 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## currently 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## debatable 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## depending 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## design 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## detailssimilar 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## devices 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## discuss 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## dollars 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## done 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## dont 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## dot 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ecosystem 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## else 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## even 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ever 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## every 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## everything 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## face 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## faceid 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## faster 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## feature 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## features 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## first 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## galaxy 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## giver 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## going 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## good 0 1 0 0 1 0 0 0 0 0 0 1 0 0
## gorgeous 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## greatly 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## hardware 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## high 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## huawei 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## image 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## increased 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## india 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## indian 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## interface 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## ios 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## issues 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## itconslets 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## job 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## kind 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## later 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## latest 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## left 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## less 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## let 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## love 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## makes 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## market 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## mean 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## meaning 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## mind 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## natural 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## nobody 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## nolets 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## notch 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## notifications 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## one 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## optimized 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## overshadows 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## packagepros 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## packed 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## par 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## phones 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## phonesconclusion 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## point 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## powerful 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## present 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## pro 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## process 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## projection 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## pros 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## provides 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## purchase 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## quality 0 1 0 0 1 0 0 0 0 0 0 1 0 0
## released 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## rupees 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## sales 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## screen 0 1 0 1 0 0 0 0 0 0 0 1 0 1
## secure 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## selling 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## significantly 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## simplistic 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## size 0 1 0 1 0 0 0 0 0 0 0 1 0 1
## slow 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## smaller 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## smartphone 0 3 0 0 0 0 0 0 0 0 0 3 0 0
## smartphones 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## snapdragon 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## software 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## space 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## stay 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## step 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## still 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## storage 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## sums 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## time 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## two 0 2 0 0 0 0 0 0 0 0 0 2 0 0
## unlike 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## unlocking 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## updates 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## upto 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## user 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## whats 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## whatsoever 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## deny 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## faulty 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## replace 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## battery 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## bigger 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## hold 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## iphonex 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## life 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## plus 0 0 0 2 0 0 0 0 0 0 0 0 0 2
## premium 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## small 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## also 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## amazing 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## appario 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## day 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## fantastic 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## fantasticsuperb 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## offers 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## overs 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## performance 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## prime 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## saved 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## thank 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## ufd 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## Docs
## Terms 179 180 181 182 183 184 185 186 187 188 189 190 191 192
## accept 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## amazon 2 0 4 0 1 0 0 0 1 0 2 0 4 0
## apple 0 0 6 0 0 0 0 7 0 0 0 0 6 0
## apples 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## apply 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## bought 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## box 0 0 1 1 0 0 0 0 0 0 0 0 1 1
## brand 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## can 0 0 1 0 0 0 0 2 0 0 0 0 1 0
## case 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## center 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## centre 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## choice 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## conditions 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## create 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## customer 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## customers 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## days 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## defective 0 0 5 0 0 0 0 0 0 0 0 0 5 0
## device 0 0 1 0 0 0 0 2 0 0 0 0 1 0
## disappointed 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## easily 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ends 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## full 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## get 0 0 4 0 0 0 0 1 0 0 0 0 4 0
## immediately 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## informationthere 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## insidei 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## iphone 0 0 3 1 0 0 0 0 0 1 0 0 3 1
## issue 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## just 0 0 4 0 0 0 0 5 0 0 0 0 4 0
## know 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## leave 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## like 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## logo 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## luckbecouse 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## mine 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## misguide 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## new 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## offered 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## option 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## ordered 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## paid 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## policy 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## price 0 0 1 0 0 0 0 4 0 0 0 0 1 0
## product 0 0 4 1 1 0 1 0 1 0 0 0 4 1
## promise 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## purchasing 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## pushing 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## read 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## received 0 0 2 0 0 0 0 0 1 0 0 0 2 0
## receivedbut 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## repair 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## repaired 0 0 3 0 0 0 0 0 0 0 0 0 3 0
## replacedthat 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## replacement 0 0 5 0 0 0 0 0 0 0 0 0 5 0
## replacementi 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## replacementnow 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## reported 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## request 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## see 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## service 1 0 3 0 1 0 0 2 0 0 1 0 3 0
## shocked 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## showing 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## stuck 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## support 0 0 2 0 0 0 0 1 0 0 0 0 2 0
## terms 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## thinking 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## told 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## took 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## tried 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## turn 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## turned 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## unfortunately 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## visit 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## warranty 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## will 0 0 2 0 0 0 0 0 0 0 0 0 2 0
## worry 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## xvery 0 0 1 0 0 0 0 0 0 0 0 0 1 0
## yes 0 0 1 0 0 0 0 1 0 0 0 0 1 0
## average 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## better 0 0 0 1 0 0 0 0 0 1 0 0 0 1
## camera 1 0 0 3 0 0 0 1 0 0 1 0 0 3
## charger 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## charging 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## con 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## crispy 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## display 1 0 0 1 0 0 0 0 0 0 1 0 0 1
## fast 0 0 0 1 0 0 1 0 0 0 0 0 0 1
## fully 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## great 0 0 0 2 0 0 0 3 0 0 0 0 0 2
## hour 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## included 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## mins 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## much 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## oneplus 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## opt 0 0 0 1 0 0 0 0 0 0 0 0 0 1
## really 0 0 0 1 0 0 0 1 0 0 0 0 0 1
## samsung 0 0 0 1 0 0 0 1 0 0 0 0 0 1
## satisfied 0 0 0 1 1 0 0 0 0 0 0 0 0 1
## takes 0 0 0 1 0 0 0 1 0 0 0 0 0 1
## deliveredhighly 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## excellent 0 0 0 0 1 1 0 0 0 0 0 0 0 0
## well 0 0 0 0 1 0 0 1 0 0 0 0 0 0
## deal 0 0 0 0 0 1 0 0 0 0 0 0 0 0
## awesome 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## delivery 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## equally 0 0 0 0 0 0 1 0 0 0 0 0 0 0
## absurd 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## almost 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## annoying 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## another 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## anything 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## argue 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ask 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## aspect 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## available 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## beautiful 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## benefits 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## best 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## biggest 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## bionic 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## bracket 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## break 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## came 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## chip 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## class 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## comes 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## coming 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## compared 0 0 0 0 0 0 0 1 0 1 0 0 0 0
## connected 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## cons 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## considering 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## continue 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## convenient 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## converted 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## coupled 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## created 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## currently 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## debatable 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## depending 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## design 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## detailssimilar 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## devices 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## discuss 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## dollars 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## done 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## dont 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## dot 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ecosystem 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## else 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## even 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ever 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## every 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## everything 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## face 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## faceid 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## faster 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## feature 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## features 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## first 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## galaxy 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## giver 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## going 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## good 1 0 0 0 0 0 0 1 0 0 1 0 0 0
## gorgeous 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## greatly 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## hardware 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## high 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## huawei 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## image 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## increased 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## india 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## indian 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## interface 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## ios 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## issues 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## itconslets 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## job 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## kind 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## later 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## latest 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## left 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## less 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## let 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## love 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## makes 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## market 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## mean 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## meaning 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## mind 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## natural 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## nobody 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## nolets 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## notch 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## notifications 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## one 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## optimized 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## overshadows 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## packagepros 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## packed 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## par 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## phones 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## phonesconclusion 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## point 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## powerful 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## present 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## pro 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## process 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## projection 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## pros 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## provides 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## purchase 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## quality 1 0 0 0 0 0 0 1 0 0 1 0 0 0
## released 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## rupees 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## sales 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## screen 0 0 0 0 0 0 0 1 0 1 0 0 0 0
## secure 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## selling 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## significantly 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## simplistic 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## size 0 0 0 0 0 0 0 1 0 1 0 0 0 0
## slow 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## smaller 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## smartphone 0 0 0 0 0 0 0 3 0 0 0 0 0 0
## smartphones 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## snapdragon 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## software 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## space 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## stay 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## step 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## still 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## storage 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## sums 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## time 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## two 0 0 0 0 0 0 0 2 0 0 0 0 0 0
## unlike 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## unlocking 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## updates 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## upto 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## user 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## whats 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## whatsoever 0 0 0 0 0 0 0 1 0 0 0 0 0 0
## deny 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## faulty 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## replace 0 0 0 0 0 0 0 0 1 0 0 0 0 0
## battery 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## bigger 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## hold 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## iphonex 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## life 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## plus 0 0 0 0 0 0 0 0 0 2 0 0 0 0
## premium 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## small 0 0 0 0 0 0 0 0 0 1 0 0 0 0
## also 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## amazing 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## appario 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## day 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## fantastic 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## fantasticsuperb 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## offers 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## overs 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## performance 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## prime 2 0 0 0 0 0 0 0 0 0 2 0 0 0
## saved 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## thank 1 0 0 0 0 0 0 0 0 0 1 0 0 0
## ufd 0 1 0 0 0 0 0 0 0 0 0 1 0 0
## Docs
## Terms 193 194 195 196 197 198 199 200
## accept 0 0 0 1 0 0 0 0
## amazon 1 0 0 0 1 0 2 0
## apple 0 0 0 7 0 0 0 0
## apples 0 0 0 0 0 0 0 0
## apply 0 0 0 0 0 0 0 0
## bought 0 0 0 0 0 0 0 0
## box 0 0 0 0 0 0 0 0
## brand 0 0 0 0 0 0 0 0
## can 0 0 0 2 0 0 0 0
## case 0 0 0 0 0 0 0 0
## center 0 0 0 0 0 0 0 0
## centre 0 0 0 0 0 0 0 0
## choice 0 0 0 0 0 0 0 0
## conditions 0 0 0 0 0 0 0 0
## create 0 0 0 0 0 0 0 0
## customer 0 0 0 1 0 0 0 0
## customers 0 0 0 0 0 0 0 0
## days 0 0 0 0 0 0 0 0
## defective 0 0 0 0 0 0 0 0
## device 0 0 0 2 0 0 0 0
## disappointed 0 0 0 0 0 0 0 0
## easily 0 0 0 0 0 0 0 0
## ends 0 0 0 0 0 0 0 0
## full 0 0 0 0 0 0 0 0
## get 0 0 0 1 0 0 0 0
## immediately 0 0 0 0 0 0 0 0
## informationthere 0 0 0 0 0 0 0 0
## insidei 0 0 0 0 0 0 0 0
## iphone 0 0 0 0 0 1 0 0
## issue 0 0 0 0 0 0 0 0
## just 0 0 0 5 0 0 0 0
## know 0 0 0 0 0 0 0 0
## leave 0 0 0 0 0 0 0 0
## like 0 0 0 0 0 0 0 0
## logo 0 0 0 0 0 0 0 0
## luckbecouse 0 0 0 0 0 0 0 0
## mine 0 0 0 0 0 0 0 0
## misguide 0 0 0 0 0 0 0 0
## new 0 0 0 0 0 0 0 0
## offered 0 0 0 0 0 0 0 0
## option 0 0 0 0 0 0 0 0
## ordered 0 0 0 0 0 0 0 0
## paid 0 0 0 0 0 0 0 0
## policy 0 0 0 0 0 0 0 0
## price 0 0 0 4 0 0 0 0
## product 1 0 1 0 1 0 0 0
## promise 0 0 0 0 0 0 0 0
## purchasing 0 0 0 0 0 0 0 0
## pushing 0 0 0 0 0 0 0 0
## read 0 0 0 0 0 0 0 0
## received 0 0 0 0 1 0 0 0
## receivedbut 0 0 0 0 0 0 0 0
## repair 0 0 0 0 0 0 0 0
## repaired 0 0 0 0 0 0 0 0
## replacedthat 0 0 0 0 0 0 0 0
## replacement 0 0 0 0 0 0 0 0
## replacementi 0 0 0 0 0 0 0 0
## replacementnow 0 0 0 0 0 0 0 0
## reported 0 0 0 0 0 0 0 0
## request 0 0 0 0 0 0 0 0
## see 0 0 0 0 0 0 0 0
## service 1 0 0 2 0 0 1 0
## shocked 0 0 0 0 0 0 0 0
## showing 0 0 0 0 0 0 0 0
## stuck 0 0 0 0 0 0 0 0
## support 0 0 0 1 0 0 0 0
## terms 0 0 0 0 0 0 0 0
## thinking 0 0 0 0 0 0 0 0
## told 0 0 0 0 0 0 0 0
## took 0 0 0 0 0 0 0 0
## tried 0 0 0 0 0 0 0 0
## turn 0 0 0 0 0 0 0 0
## turned 0 0 0 0 0 0 0 0
## unfortunately 0 0 0 0 0 0 0 0
## visit 0 0 0 0 0 0 0 0
## warranty 0 0 0 0 0 0 0 0
## will 0 0 0 0 0 0 0 0
## worry 0 0 0 0 0 0 0 0
## xvery 0 0 0 0 0 0 0 0
## yes 0 0 0 1 0 0 0 0
## average 0 0 0 0 0 0 0 0
## better 0 0 0 0 0 1 0 0
## camera 0 0 0 1 0 0 1 0
## charger 0 0 0 0 0 0 0 0
## charging 0 0 0 0 0 0 0 0
## con 0 0 0 0 0 0 0 0
## crispy 0 0 0 0 0 0 0 0
## display 0 0 0 0 0 0 1 0
## fast 0 0 1 0 0 0 0 0
## fully 0 0 0 0 0 0 0 0
## great 0 0 0 3 0 0 0 0
## hour 0 0 0 0 0 0 0 0
## included 0 0 0 0 0 0 0 0
## mins 0 0 0 0 0 0 0 0
## much 0 0 0 0 0 0 0 0
## oneplus 0 0 0 0 0 0 0 0
## opt 0 0 0 0 0 0 0 0
## really 0 0 0 1 0 0 0 0
## samsung 0 0 0 1 0 0 0 0
## satisfied 1 0 0 0 0 0 0 0
## takes 0 0 0 1 0 0 0 0
## deliveredhighly 1 0 0 0 0 0 0 0
## excellent 1 1 0 0 0 0 0 0
## well 1 0 0 1 0 0 0 0
## deal 0 1 0 0 0 0 0 0
## awesome 0 0 1 0 0 0 0 0
## delivery 0 0 1 0 0 0 0 0
## equally 0 0 1 0 0 0 0 0
## absurd 0 0 0 1 0 0 0 0
## almost 0 0 0 1 0 0 0 0
## annoying 0 0 0 1 0 0 0 0
## another 0 0 0 1 0 0 0 0
## anything 0 0 0 1 0 0 0 0
## argue 0 0 0 1 0 0 0 0
## ask 0 0 0 1 0 0 0 0
## aspect 0 0 0 1 0 0 0 0
## available 0 0 0 2 0 0 0 0
## beautiful 0 0 0 1 0 0 0 0
## benefits 0 0 0 1 0 0 0 0
## best 0 0 0 3 0 0 0 0
## biggest 0 0 0 2 0 0 0 0
## bionic 0 0 0 1 0 0 0 0
## bracket 0 0 0 1 0 0 0 0
## break 0 0 0 1 0 0 0 0
## came 0 0 0 1 0 0 0 0
## chip 0 0 0 3 0 0 0 0
## class 0 0 0 1 0 0 0 0
## comes 0 0 0 1 0 0 0 0
## coming 0 0 0 2 0 0 0 0
## compared 0 0 0 1 0 1 0 0
## connected 0 0 0 1 0 0 0 0
## cons 0 0 0 1 0 0 0 0
## considering 0 0 0 1 0 0 0 0
## continue 0 0 0 1 0 0 0 0
## convenient 0 0 0 1 0 0 0 0
## converted 0 0 0 1 0 0 0 0
## coupled 0 0 0 1 0 0 0 0
## created 0 0 0 1 0 0 0 0
## currently 0 0 0 1 0 0 0 0
## debatable 0 0 0 1 0 0 0 0
## depending 0 0 0 1 0 0 0 0
## design 0 0 0 1 0 0 0 0
## detailssimilar 0 0 0 1 0 0 0 0
## devices 0 0 0 3 0 0 0 0
## discuss 0 0 0 1 0 0 0 0
## dollars 0 0 0 1 0 0 0 0
## done 0 0 0 1 0 0 0 0
## dont 0 0 0 1 0 0 0 0
## dot 0 0 0 1 0 0 0 0
## ecosystem 0 0 0 1 0 0 0 0
## else 0 0 0 1 0 0 0 0
## even 0 0 0 1 0 0 0 0
## ever 0 0 0 1 0 0 0 0
## every 0 0 0 1 0 0 0 0
## everything 0 0 0 1 0 0 0 0
## face 0 0 0 1 0 0 0 0
## faceid 0 0 0 2 0 0 0 0
## faster 0 0 0 2 0 0 0 0
## feature 0 0 0 1 0 0 0 0
## features 0 0 0 1 0 0 0 0
## first 0 0 0 1 0 0 0 0
## galaxy 0 0 0 1 0 0 0 0
## giver 0 0 0 1 0 0 0 0
## going 0 0 0 1 0 0 0 0
## good 0 0 0 1 0 0 1 0
## gorgeous 0 0 0 1 0 0 0 0
## greatly 0 0 0 1 0 0 0 0
## hardware 0 0 0 1 0 0 0 0
## high 0 0 0 1 0 0 0 0
## huawei 0 0 0 1 0 0 0 0
## image 0 0 0 1 0 0 0 0
## increased 0 0 0 1 0 0 0 0
## india 0 0 0 1 0 0 0 0
## indian 0 0 0 1 0 0 0 0
## interface 0 0 0 1 0 0 0 0
## ios 0 0 0 2 0 0 0 0
## issues 0 0 0 1 0 0 0 0
## itconslets 0 0 0 1 0 0 0 0
## job 0 0 0 1 0 0 0 0
## kind 0 0 0 1 0 0 0 0
## later 0 0 0 1 0 0 0 0
## latest 0 0 0 1 0 0 0 0
## left 0 0 0 1 0 0 0 0
## less 0 0 0 1 0 0 0 0
## let 0 0 0 1 0 0 0 0
## love 0 0 0 1 0 0 0 0
## makes 0 0 0 1 0 0 0 0
## market 0 0 0 1 0 0 0 0
## mean 0 0 0 1 0 0 0 0
## meaning 0 0 0 1 0 0 0 0
## mind 0 0 0 1 0 0 0 0
## natural 0 0 0 1 0 0 0 0
## nobody 0 0 0 1 0 0 0 0
## nolets 0 0 0 1 0 0 0 0
## notch 0 0 0 2 0 0 0 0
## notifications 0 0 0 1 0 0 0 0
## one 0 0 0 1 0 0 0 0
## optimized 0 0 0 1 0 0 0 0
## overshadows 0 0 0 1 0 0 0 0
## packagepros 0 0 0 1 0 0 0 0
## packed 0 0 0 1 0 0 0 0
## par 0 0 0 1 0 0 0 0
## phones 0 0 0 1 0 0 0 0
## phonesconclusion 0 0 0 1 0 0 0 0
## point 0 0 0 1 0 0 0 0
## powerful 0 0 0 1 0 0 0 0
## present 0 0 0 1 0 0 0 0
## pro 0 0 0 1 0 0 0 0
## process 0 0 0 1 0 0 0 0
## projection 0 0 0 1 0 0 0 0
## pros 0 0 0 1 0 0 0 0
## provides 0 0 0 2 0 0 0 0
## purchase 0 0 0 1 0 0 0 0
## quality 0 0 0 1 0 0 1 0
## released 0 0 0 1 0 0 0 0
## rupees 0 0 0 1 0 0 0 0
## sales 0 0 0 1 0 0 0 0
## screen 0 0 0 1 0 1 0 0
## secure 0 0 0 1 0 0 0 0
## selling 0 0 0 1 0 0 0 0
## significantly 0 0 0 1 0 0 0 0
## simplistic 0 0 0 1 0 0 0 0
## size 0 0 0 1 0 1 0 0
## slow 0 0 0 1 0 0 0 0
## smaller 0 0 0 1 0 0 0 0
## smartphone 0 0 0 3 0 0 0 0
## smartphones 0 0 0 1 0 0 0 0
## snapdragon 0 0 0 1 0 0 0 0
## software 0 0 0 1 0 0 0 0
## space 0 0 0 2 0 0 0 0
## stay 0 0 0 1 0 0 0 0
## step 0 0 0 1 0 0 0 0
## still 0 0 0 1 0 0 0 0
## storage 0 0 0 1 0 0 0 0
## sums 0 0 0 1 0 0 0 0
## time 0 0 0 1 0 0 0 0
## two 0 0 0 2 0 0 0 0
## unlike 0 0 0 1 0 0 0 0
## unlocking 0 0 0 1 0 0 0 0
## updates 0 0 0 1 0 0 0 0
## upto 0 0 0 1 0 0 0 0
## user 0 0 0 1 0 0 0 0
## whats 0 0 0 1 0 0 0 0
## whatsoever 0 0 0 1 0 0 0 0
## deny 0 0 0 0 1 0 0 0
## faulty 0 0 0 0 1 0 0 0
## replace 0 0 0 0 1 0 0 0
## battery 0 0 0 0 0 1 0 0
## bigger 0 0 0 0 0 1 0 0
## hold 0 0 0 0 0 1 0 0
## iphonex 0 0 0 0 0 1 0 0
## life 0 0 0 0 0 1 0 0
## plus 0 0 0 0 0 2 0 0
## premium 0 0 0 0 0 1 0 0
## small 0 0 0 0 0 1 0 0
## also 0 0 0 0 0 0 1 0
## amazing 0 0 0 0 0 0 1 0
## appario 0 0 0 0 0 0 1 0
## day 0 0 0 0 0 0 2 0
## fantastic 0 0 0 0 0 0 1 0
## fantasticsuperb 0 0 0 0 0 0 1 0
## offers 0 0 0 0 0 0 2 0
## overs 0 0 0 0 0 0 1 0
## performance 0 0 0 0 0 0 1 0
## prime 0 0 0 0 0 0 2 0
## saved 0 0 0 0 0 0 1 0
## thank 0 0 0 0 0 0 1 0
## ufd 0 0 0 0 0 0 0 1
tdm1[100:109,1:10]
## Docs
## Terms 1 2 3 4 5 6 7 8 9 10
## satisfied 0 1 1 0 0 0 0 0 0 0
## takes 0 1 0 0 0 1 0 0 0 0
## deliveredhighly 0 0 1 0 0 0 0 0 0 0
## excellent 0 0 1 1 0 0 0 0 0 0
## well 0 0 1 0 0 1 0 0 0 0
## deal 0 0 0 1 0 0 0 0 0 0
## awesome 0 0 0 0 1 0 0 0 0 0
## delivery 0 0 0 0 1 0 0 0 0 0
## equally 0 0 0 0 1 0 0 0 0 0
## absurd 0 0 0 0 0 1 0 0 0 0
tdm1[1:20,1:20]
## Docs
## Terms 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20
## accept 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0
## amazon 4 0 1 0 0 0 1 0 2 0 4 0 1 0 0 0 1 0 2 0
## apple 6 0 0 0 0 7 0 0 0 0 6 0 0 0 0 7 0 0 0 0
## apples 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## apply 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## bought 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## box 1 1 0 0 0 0 0 0 0 0 1 1 0 0 0 0 0 0 0 0
## brand 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## can 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0
## case 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## center 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## centre 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## choice 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## conditions 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## create 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## customer 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0
## customers 1 0 0 0 0 0 0 0 0 0 1 0 0 0 0 0 0 0 0 0
## days 2 0 0 0 0 0 0 0 0 0 2 0 0 0 0 0 0 0 0 0
## defective 5 0 0 0 0 0 0 0 0 0 5 0 0 0 0 0 0 0 0 0
## device 1 0 0 0 0 2 0 0 0 0 1 0 0 0 0 2 0 0 0 0
w <- rowSums(tdm1)
w
## accept amazon apple apples
## 40 160 260 40
## apply bought box brand
## 20 20 40 20
## can case center centre
## 60 40 20 40
## choice conditions create customer
## 40 20 20 40
## customers days defective device
## 20 40 100 60
## disappointed easily ends full
## 20 20 20 20
## get immediately informationthere insidei
## 100 20 20 20
## iphone issue just know
## 100 20 180 20
## leave like logo luckbecouse
## 20 20 20 20
## mine misguide new offered
## 20 20 20 20
## option ordered paid policy
## 20 20 20 40
## price product promise purchasing
## 100 160 20 20
## pushing read received receivedbut
## 20 20 60 20
## repair repaired replacedthat replacement
## 20 60 20 100
## replacementi replacementnow reported request
## 20 20 20 20
## see service shocked showing
## 20 140 20 20
## stuck support terms thinking
## 20 60 20 20
## told took tried turn
## 20 20 20 20
## turned unfortunately visit warranty
## 20 20 20 20
## will worry xvery yes
## 40 20 20 40
## average better camera charger
## 20 40 100 20
## charging con crispy display
## 20 20 20 40
## fast fully great hour
## 40 20 100 20
## included mins much oneplus
## 20 20 20 20
## opt really samsung satisfied
## 20 40 40 40
## takes deliveredhighly excellent well
## 40 20 40 40
## deal awesome delivery equally
## 20 20 20 20
## absurd almost annoying another
## 20 20 20 20
## anything argue ask aspect
## 20 20 20 20
## available beautiful benefits best
## 40 20 20 60
## biggest bionic bracket break
## 40 20 20 20
## came chip class comes
## 20 60 20 20
## coming compared connected cons
## 40 40 20 20
## considering continue convenient converted
## 20 20 20 20
## coupled created currently debatable
## 20 20 20 20
## depending design detailssimilar devices
## 20 20 20 60
## discuss dollars done dont
## 20 20 20 20
## dot ecosystem else even
## 20 20 20 20
## ever every everything face
## 20 20 20 20
## faceid faster feature features
## 40 40 20 20
## first galaxy giver going
## 20 20 20 20
## good gorgeous greatly hardware
## 40 20 20 20
## high huawei image increased
## 20 20 20 20
## india indian interface ios
## 20 20 20 40
## issues itconslets job kind
## 20 20 20 20
## later latest left less
## 20 20 20 20
## let love makes market
## 20 20 20 20
## mean meaning mind natural
## 20 20 20 20
## nobody nolets notch notifications
## 20 20 40 20
## one optimized overshadows packagepros
## 20 20 20 20
## packed par phones phonesconclusion
## 20 20 20 20
## point powerful present pro
## 20 20 20 20
## process projection pros provides
## 20 20 20 40
## purchase quality released rupees
## 20 40 20 20
## sales screen secure selling
## 20 40 20 20
## significantly simplistic size slow
## 20 20 40 20
## smaller smartphone smartphones snapdragon
## 20 60 20 20
## software space stay step
## 20 40 20 20
## still storage sums time
## 20 20 20 20
## two unlike unlocking updates
## 40 20 20 20
## upto user whats whatsoever
## 20 20 20 20
## deny faulty replace battery
## 20 20 20 20
## bigger hold iphonex life
## 20 20 20 20
## plus premium small also
## 40 20 20 20
## amazing appario day fantastic
## 20 20 40 20
## fantasticsuperb offers overs performance
## 20 40 20 20
## prime saved thank ufd
## 40 20 20 20
w_sub <- subset(w,w>=20)
w_sub
## accept amazon apple apples
## 40 160 260 40
## apply bought box brand
## 20 20 40 20
## can case center centre
## 60 40 20 40
## choice conditions create customer
## 40 20 20 40
## customers days defective device
## 20 40 100 60
## disappointed easily ends full
## 20 20 20 20
## get immediately informationthere insidei
## 100 20 20 20
## iphone issue just know
## 100 20 180 20
## leave like logo luckbecouse
## 20 20 20 20
## mine misguide new offered
## 20 20 20 20
## option ordered paid policy
## 20 20 20 40
## price product promise purchasing
## 100 160 20 20
## pushing read received receivedbut
## 20 20 60 20
## repair repaired replacedthat replacement
## 20 60 20 100
## replacementi replacementnow reported request
## 20 20 20 20
## see service shocked showing
## 20 140 20 20
## stuck support terms thinking
## 20 60 20 20
## told took tried turn
## 20 20 20 20
## turned unfortunately visit warranty
## 20 20 20 20
## will worry xvery yes
## 40 20 20 40
## average better camera charger
## 20 40 100 20
## charging con crispy display
## 20 20 20 40
## fast fully great hour
## 40 20 100 20
## included mins much oneplus
## 20 20 20 20
## opt really samsung satisfied
## 20 40 40 40
## takes deliveredhighly excellent well
## 40 20 40 40
## deal awesome delivery equally
## 20 20 20 20
## absurd almost annoying another
## 20 20 20 20
## anything argue ask aspect
## 20 20 20 20
## available beautiful benefits best
## 40 20 20 60
## biggest bionic bracket break
## 40 20 20 20
## came chip class comes
## 20 60 20 20
## coming compared connected cons
## 40 40 20 20
## considering continue convenient converted
## 20 20 20 20
## coupled created currently debatable
## 20 20 20 20
## depending design detailssimilar devices
## 20 20 20 60
## discuss dollars done dont
## 20 20 20 20
## dot ecosystem else even
## 20 20 20 20
## ever every everything face
## 20 20 20 20
## faceid faster feature features
## 40 40 20 20
## first galaxy giver going
## 20 20 20 20
## good gorgeous greatly hardware
## 40 20 20 20
## high huawei image increased
## 20 20 20 20
## india indian interface ios
## 20 20 20 40
## issues itconslets job kind
## 20 20 20 20
## later latest left less
## 20 20 20 20
## let love makes market
## 20 20 20 20
## mean meaning mind natural
## 20 20 20 20
## nobody nolets notch notifications
## 20 20 40 20
## one optimized overshadows packagepros
## 20 20 20 20
## packed par phones phonesconclusion
## 20 20 20 20
## point powerful present pro
## 20 20 20 20
## process projection pros provides
## 20 20 20 40
## purchase quality released rupees
## 20 40 20 20
## sales screen secure selling
## 20 40 20 20
## significantly simplistic size slow
## 20 20 40 20
## smaller smartphone smartphones snapdragon
## 20 60 20 20
## software space stay step
## 20 40 20 20
## still storage sums time
## 20 20 20 20
## two unlike unlocking updates
## 40 20 20 20
## upto user whats whatsoever
## 20 20 20 20
## deny faulty replace battery
## 20 20 20 20
## bigger hold iphonex life
## 20 20 20 20
## plus premium small also
## 40 20 20 20
## amazing appario day fantastic
## 20 20 40 20
## fantasticsuperb offers overs performance
## 20 40 20 20
## prime saved thank ufd
## 40 20 20 20
barplot(w_sub,lwd=2,col = rainbow(30))

#install.packages("wordcloud")
library(wordcloud)
## Warning: package 'wordcloud' was built under R version 3.5.1
## Loading required package: RColorBrewer
w_sub1 <- sort(rowSums(tdm1),decreasing = TRUE)
wordcloud(words = names(w_sub1),freq = w_sub1,random.order = F,colors = rainbow(30),scale = c(3,1),rot.per = 0.6)
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : replacementnow could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : showing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : thinking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : unfortunately could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : warranty could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : charger could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : charging could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : crispy could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : oneplus could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : deliveredhighly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : awesome could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : equally could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : almost could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : annoying could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : another could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : anything could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : argue could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : aspect could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : beautiful could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : benefits could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : bionic could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : bracket could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : break could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : came could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : class could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : comes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : connected could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : cons could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : considering could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : continue could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : convenient could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : converted could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : coupled could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : created could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : currently could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : debatable could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : depending could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : design could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : detailssimilar could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : discuss could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : dollars could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : done could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : ecosystem could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : else could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : even could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : every could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : everything could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : feature could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : features could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : galaxy could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : giver could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : going could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : gorgeous could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : greatly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : hardware could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : high could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : huawei could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : image could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : increased could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : india could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : indian could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : interface could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : issues could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : itconslets could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : job could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : kind could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : later could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : latest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : less could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : love could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : makes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : market could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : mean could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : meaning could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : mind could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : natural could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : nobody could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : nolets could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : notifications could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : optimized could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : overshadows could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : packagepros could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : packed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : par could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : phones could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : phonesconclusion could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : point could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : powerful could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : present could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : pro could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : process could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : projection could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : pros could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : purchase could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : released could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : rupees could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : sales could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : secure could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : selling could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : significantly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : simplistic could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : slow could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : smaller could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : smartphones could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : snapdragon could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : software could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : stay could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : step could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : storage could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : sums could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : time could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : unlike could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : unlocking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : updates could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : upto could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : user could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : whats could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : whatsoever could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : deny could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : faulty could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : replace could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : battery could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : bigger could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : hold could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : iphonex could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : premium could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : small could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : also could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : amazing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : appario could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : fantastic could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : fantasticsuperb could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : overs could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : performance could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : saved could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : thank could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = names(w_sub1), freq = w_sub1, random.order =
## F, : ufd could not be fit on page. It will not be plotted.

w_small <- subset(w,w>=100)
#install.packages("wordcloud2")
library(wordcloud2)
## Warning: package 'wordcloud2' was built under R version 3.5.1
w1 <- data.frame(names(w_small),w_small)
colnames(w1) <- c("word","freq")
wordcloud2(w1,size = 0.5,shape = "circle")
wordcloud2(w1,size = 0.5,shape = "triangle")