Task 1: Election Forecasting Revisited

n this homework problem, we’ll revisit our logistic regression model from Unit 3, and learn how to plot the output on a map of the United States. Unlike what we did in the Crime lecture, this time we’ll be plotting predictions rather than data!

First, load the ggplot2, maps, and ggmap packages using the library function. All three packages should be installed on your computer from lecture, but if not, you may need to install them too using the install.packages function.

Then, load the US map and save it to the variable statesMap, like we did during the Crime lecture:

statesMap = map_data(“state”)

The maps package contains other built-in maps, including a US county map, a world map, and maps for France and Italy.

library(ggplot2)
library(maps)
## Warning: package 'maps' was built under R version 4.0.3
library(ggmap)
## Warning: package 'ggmap' was built under R version 4.0.3
## Google's Terms of Service: https://cloud.google.com/maps-platform/terms/.
## Please cite ggmap if you use it! See citation("ggmap") for details.

If you look at the structure of the statesMap data frame using the str function, you should see that there are 6 variables. One of the variables, group, defines the different shapes or polygons on the map. Sometimes a state may have multiple groups, for example, if it includes islands. How many different groups are there?

statesMap <- map_data("state")
str(statesMap)
## 'data.frame':    15537 obs. of  6 variables:
##  $ long     : num  -87.5 -87.5 -87.5 -87.5 -87.6 ...
##  $ lat      : num  30.4 30.4 30.4 30.3 30.3 ...
##  $ group    : num  1 1 1 1 1 1 1 1 1 1 ...
##  $ order    : int  1 2 3 4 5 6 7 8 9 10 ...
##  $ region   : chr  "alabama" "alabama" "alabama" "alabama" ...
##  $ subregion: chr  NA NA NA NA ...
table(statesMap$group)
## 
##    1    2    3    4    5    6    7    8    9   10   11   12   13   14   15   16 
##  202  149  312  516   79   91   94   10  872  381  233  329  257  256  113  397 
##   17   18   19   20   21   22   23   24   25   26   27   28   29   30   31   32 
##  650  399  566   36  220   30  460  370  373  382  315  238  208   70  125  205 
##   33   34   35   36   37   38   39   40   41   42   43   44   45   46   47   48 
##   78   16  290   21  168   37  733   12  105  238  284  236  172   66  304  166 
##   49   50   51   52   53   54   55   56   57   58   59   60   61   62   63 
##  289 1088   59  129   96   15  623   17   17   19   44  448  373  388   68

Maps of the US

You can draw a map of the United States by typing the following in your R console:

ggplot(statesMap, aes(x = long, y = lat, group = group)) + geom_polygon(fill = “white”, color = “black”)

We specified two colors in geom_polygon – fill and color. Which one defined the color of the outline of the states?

ggplot(statesMap, aes(x = long, y = lat, group = group)) + geom_polygon(fill = "white", color = "black")

Coloring the states by Predictions

Load the data using the read.csv function, and call it “polling”. Then split the data using the subset function into a training set called “Train” that has observations from 2004 and 2008, and a testing set called “Test” that has observations from 2012.

Note that we only have 45 states in our testing set, since we are missing observations for Alaska, Delaware, Alabama, Wyoming, and Vermont, so these states will not appear colored in our map.

Then, create a logistic regression model and make predictions on the test set using the following commands:

mod2 = glm(Republican~SurveyUSA+DiffCount, data=Train, family=“binomial”)

TestPrediction = predict(mod2, newdata=Test, type=“response”)

TestPrediction gives the predicted probabilities for each state, but let’s also create a vector of Republican/Democrat predictions by using the following command:

TestPredictionBinary = as.numeric(TestPrediction > 0.5)

Now, put the predictions and state labels in a data.frame so that we can use ggplot:

predictionDataFrame = data.frame(TestPrediction, TestPredictionBinary, Test$State)

To make sure everything went smoothly, answer the following questions.

For how many states is our binary prediction 1 (for 2012), corresponding to Republican?

polling <- read.csv("PollingImputed.csv")

Train <- subset(polling, Year <= 2008)
Test <- subset(polling, Year > 2008)

mod2 <- glm(Republican~SurveyUSA+DiffCount, data=Train, family="binomial")
TestPrediction <-  predict(mod2, newdata=Test, type="response")

TestPredictionBinary <- as.numeric(TestPrediction > 0.5)

table(TestPredictionBinary)
## TestPredictionBinary
##  0  1 
## 23 22
mean(TestPrediction)
## [1] 0.4852626

Coloring the states

Now, we need to merge “predictionDataFrame” with the map data “statesMap”, like we did in lecture. Before doing so, we need to convert the Test.State variable to lowercase, so that it matches the region variable in statesMap. Do this by typing the following in your R console:

predictionDataFrame\(region = tolower(predictionDataFrame\)Test.State)

Now, merge the two data frames using the following command:

predictionMap = merge(statesMap, predictionDataFrame, by = “region”)

Lastly, we need to make sure the observations are in order so that the map is drawn properly, by typing the following:

predictionMap = predictionMap[order(predictionMap$order),]

How many observations are there in predictionMap?

predictionDataFrame <- Test
predictionDataFrame$region <- tolower(predictionDataFrame$State)
predictionDataFrame$Predicted <- TestPredictionBinary

predictionDataFrame$Predicted_Val <- TestPrediction

View(predictionDataFrame)

# Merging the data
predictionMap <- merge(statesMap, predictionDataFrame, by = "region")

#make sure everything's in order
predictionMap <- predictionMap[order(predictionMap$order),]

Coloring the staets by predictions

Now we are ready to color the US map with our predictions! You can color the states according to our binary predictions by typing the following in your R console:

ggplot(predictionMap, aes(x = long, y = lat, group = group, fill = TestPredictionBinary)) + geom_polygon(color = “black”)

The states appear light blue and dark blue in this map. Which color represents a Republican prediction?

ggplot(predictionMap, aes(x = long, y = lat, group = group, fill = Predicted)) + geom_polygon(color = "black")

# Coloring the outcomes: discrete numbers

We see that the legend displays a blue gradient for outcomes between 0 and 1. However, when plotting the binary predictions there are only two possible outcomes: 0 or 1. Let’s replot the map with discrete outcomes. We can also change the color scheme to blue and red, to match the blue color associated with the Democratic Party in the US and the red color associated with the Republican Party in the US. This can be done with the following command:

ggplot(predictionMap, aes(x = long, y = lat, group = group, fill = TestPredictionBinary))+ geom_polygon(color = “black”) + scale_fill_gradient(low = “blue”, high = “red”, guide = “legend”, breaks= c(0,1), labels = c(“Democrat”, “Republican”), name = “Prediction 2012”)

Alternatively, we could plot the probabilities instead of the binary predictions. Change the plot command above to instead color the states by the variable TestPrediction. You should see a gradient of colors ranging from red to blue. Do the colors of the states in the map for TestPrediction look different from the colors of the states in the map with TestPredictionBinary? Why or why not?

NOTE: If you have a hard time seeing the red/blue gradient, feel free to change the color scheme, by changing the arguments low = “blue” and high = “red” to colors of your choice (to see all of the color options in R, type colors() in your R console). You can even change it to a gray scale, by changing the low and high colors to “gray” and “black”.

ggplot(predictionMap, aes(x = long, y = lat, group = group, fill = Predicted))+
  geom_polygon(color = "black") + 
  scale_fill_gradient(low = "blue", high = "red", guide = "legend", breaks= c(0,1), labels = c("Democrat", "Republican"), name = "Prediction 2012")

Or…

ggplot(predictionMap, aes(x = long, y = lat, group = group, fill = Predicted_Val))+
  geom_polygon(color = "black") + 
  scale_fill_gradient(low = "gray", high = "black", guide = "legend", name = "Prediction 2012")

Parameter settings

In this part, we’ll explore what the different parameter settings of geom_polygon do. Throughout the problem, use the help page for geom_polygon, which can be accessed by ?geom_polygon. To see more information about a certain parameter, just type a question mark and then the parameter name to get the help page for that parameter. Experiment with different parameter settings to try and replicate the plots!

We’ll be asking questions about the following three plots:

#Plot 1 -- dashed
ggplot(predictionMap, aes(x = long, y = lat, group = group, fill = Predicted))+
  geom_polygon(color = "black", linetype = 2) + 
  scale_fill_gradient(low = "blue", high = "red", guide = "legend", breaks= c(0,1), labels = c("Democrat", "Republican"), name = "Prediction 2012")

#Plot 2-- bold lines
ggplot(predictionMap, aes(x = long, y = lat, group = group, fill = Predicted))+
  geom_polygon(color = "black", size = 2) + 
  scale_fill_gradient(low = "blue", high = "red", guide = "legend", breaks= c(0,1), labels = c("Democrat", "Republican"), name = "Prediction 2012")

#Plot3-- opacity
ggplot(predictionMap, aes(x = long, y = lat, group = group, fill = Predicted))+
  geom_polygon(color = "black", alpha = 0.3) + 
  scale_fill_gradient(low = "blue", high = "red", guide = "legend", breaks= c(0,1), labels = c("Democrat", "Republican"), name = "Prediction 2012")

Task 2: Visualizing Network Data

The cliche goes that the world is an increasingly interconnected place, and the connections between different entities are often best represented with a graph. Graphs are comprised of vertices (also often called “nodes”) and edges connecting those nodes. In this assignment, we will learn how to visualize networks using the igraph package in R.

For this assignment, we will visualize social networking data using anonymized data from Facebook; this data was originally curated in a recent paper about computing social circles in social networks. In our visualizations, the vertices in our network will represent Facebook users and the edges will represent these users being Facebook friends with each other.

The first file we will use, edges.csv, contains variables V1 and V2, which label the endpoints of edges in our network. Each row represents a pair of users in our graph who are Facebook friends. For a pair of friends A and B, edges.csv will only contain a single row – the smaller identifier will be listed first in this row. From this row, we will know that A is friends with B and B is friends with A.

The second file, users.csv, contains information about the Facebook users, who are the vertices in our network. This file contains the following variables:

edges <- read.csv("edges.csv")
users <- read.csv("users.csv")

nrow(edges)*2/nrow(users)
## [1] 4.949153
table(users$locale)
## 
##     A  B 
##  3  6 50
table(users$gender, users$school)
##    
##         A AB
##      1  1  0
##   A 11  3  1
##   B 28 13  1

Creating a network

We will be using the igraph package to visualize networks; install and load this package using the install.packages and library commands.

We can create a new graph object using the graph.data.frame() function. Based on ?graph.data.frame, which of the following commands will create a graph g describing our social network, with the attributes of each user correctly loaded?

Note: A directed graph is one where the edges only go one way – they point from one vertex to another. The other option is an undirected graph, which means that the relations between the vertices are symmetric.

library(igraph)
## Warning: package 'igraph' was built under R version 4.0.3
## 
## Attaching package: 'igraph'
## The following objects are masked from 'package:stats':
## 
##     decompose, spectrum
## The following object is masked from 'package:base':
## 
##     union
g <- graph.data.frame(edges, FALSE, users)

Creating networks

Use the correct command from Problem 2.1 to load the graph g.

Now, we want to plot our graph. By default, the vertices are large and have text labels of a user’s identifier. Because this would clutter the output, we will plot with no text labels and smaller vertices:

plot(g, vertex.size=5, vertex.label=NA)

In this graph, there are a number of groups of nodes where all the nodes in each group are connected but the groups are disjoint from one another, forming “islands” in the graph. Such groups are called “connected components,” or “components” for short. How many connected components with at least 2 nodes are there in the graph?

plot(g, vertex.size = 5, vertex.label = NA)

In our graph, the “degree” of a node is its number of friends. We have already seen that some nodes in our graph have degree 0 (these are the nodes with no friends), while others have much higher degree. We can use degree(g) to compute the degree of all the nodes in our graph g.

How many users are friends with 10 or more other Facebook users in this network?

degree(g)
## 3981 3982 3983 3984 3985 3986 3987 3988 3989 3990 3991 3992 3993 3994 3995  594 
##    7   13    1    0    5    8    1    6    5    3    2    2    5   10    8    3 
## 3996 3997 3998 3999 4000 4001 4002 4003 4004 4005 4006 4007 4008 4009 4010 4011 
##    3   10   13    3    8    1    6    4    9    2    1    3    0    9    0    3 
## 4012 4013 4014 4015 4016 4017 4018 4019 4020 4021 4022 4023 4024 4025 4026 4027 
##    1    5   11    0    3    8    6    7    7   10    0   17    0    3    8    6 
## 4028 4029 4030 4031 4032 4033 4034 4035 4036 4037 4038 
##    1    1   18   10    1    2    1    0    1    3    8
class(degree(g))
## [1] "numeric"
table(degree(g))
## 
##  0  1  2  3  4  5  6  7  8  9 10 11 13 17 18 
##  7 10  4  9  1  4  4  3  6  2  4  1  2  1  1

modifying network elements

In a network, it’s often visually useful to draw attention to “important” nodes in the network. While this might mean different things in different contexts, in a social network we might consider a user with a large number of friends to be an important user. From the previous problem, we know this is the same as saying that nodes with a high degree are important users.

To visually draw attention to these nodes, we will change the size of the vertices so the vertices with high degrees are larger. To do this, we will change the “size” attribute of the vertices of our graph to be an increasing function of their degrees:

V(g)$size = degree(g)/2+2

Now that we have specified the vertex size of each vertex, we will no longer use the vertex.size parameter when we plot our graph:

plot(g, vertex.label=NA)

V(g)$size = degree(g)/2+2
plot(g, vertex.label=NA)

V(g)
## + 59/59 vertices, named, from fb6fca1:
##  [1] 3981 3982 3983 3984 3985 3986 3987 3988 3989 3990 3991 3992 3993 3994 3995
## [16] 594  3996 3997 3998 3999 4000 4001 4002 4003 4004 4005 4006 4007 4008 4009
## [31] 4010 4011 4012 4013 4014 4015 4016 4017 4018 4019 4020 4021 4022 4023 4024
## [46] 4025 4026 4027 4028 4029 4030 4031 4032 4033 4034 4035 4036 4037 4038
max(V(g)$size)
## [1] 11
min(V(g)$size)
## [1] 2

Coloring vertices

Thus far, we have changed the “size” attributes of our vertices. However, we can also change the colors of vertices to capture additional information about the Facebook users we are depicting.

When changing the size of nodes, we first obtained the vertices of our graph with V(g) and then accessed the the size attribute with V(g)\(size. To change the color, we will update the attribute V(g)\)color.

To color the vertices based on the gender of the user, we will need access to that variable. When we created our graph g, we provided it with the data frame users, which had variables gender, school, and locale. These are now stored as attributes V(g)\(gender, V(g)\)school, and V(g)$locale.

We can update the colors by setting the color to black for all vertices, than setting it to red for the vertices with gender A and setting it to gray for the vertices with gender B:

V(g)$color = “black”

V(g)\(color[V(g)\)gender == “A”] = “red”

V(g)\(color[V(g)\)gender == “B”] = “gray”

Plot the resulting graph. What is the gender of the users with the highest degree in the graph?

V(g)$color <-  "black"

V(g)$color[V(g)$gender == "A"] <-  "red"

V(g)$color[V(g)$gender == "B"] <-  "gray"

plot(g, vertex.label=NA)

Now, color the vertices based on the school that each user in our network attended.

Are the two users who attended both schools A and B Facebook friends with each other?

V(g)$color <-  "black"

V(g)$color[V(g)$school == "A"] <-  "red"

V(g)$color[V(g)$school == "AB"] <-  "blue"

plot(g, vertex.label=NA)

Now, color the vertices based on the locale of the user.

The large connected component is most associated with which locale?

V(g)$color <-  "black"

V(g)$color[V(g)$locale == "A"] <-  "red"

V(g)$color[V(g)$locale == "B"] <-  "blue"

plot(g, vertex.label=NA)

Task 3: Word CLOUDS :))

Earlier in the course, we used text analytics as a predictive tool, using word frequencies as independent variables in our models. However, sometimes our goal is to understand commonly occurring topics in text data instead of to predict the value of some dependent variable. In such cases, word clouds can be a visually appealing way to display the most frequent words in a body of text.

A word cloud arranges the most common words in some text, using size to indicate the frequency of a word. For instance, this is a word cloud for the complete works of Shakespeare, removing English stopwords:

library(tm)
## Warning: package 'tm' was built under R version 4.0.3
## Loading required package: NLP
## Warning: package 'NLP' was built under R version 4.0.3
## 
## Attaching package: 'NLP'
## The following object is masked from 'package:ggplot2':
## 
##     annotate
tweets <- read.csv("tweets.csv", stringsAsFactors = FALSE)
corpus <- Corpus(VectorSource(tweets$Tweet))

corpus <- tm_map(corpus, content_transformer(tolower))
## Warning in tm_map.SimpleCorpus(corpus, content_transformer(tolower)):
## transformation drops documents
corpus <- tm_map(corpus, removePunctuation)
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
corpus <- tm_map(corpus, removeWords, stopwords("english"))
## Warning in tm_map.SimpleCorpus(corpus, removeWords, stopwords("english")):
## transformation drops documents
dtm <- DocumentTermMatrix(corpus)

allTweets <- as.data.frame(as.matrix(dtm))
dtm
## <<DocumentTermMatrix (documents: 1181, terms: 3780)>>
## Non-/sparse entries: 10273/4453907
## Sparsity           : 100%
## Maximal term length: 115
## Weighting          : term frequency (tf)

Building Word Clouds

Install and load the “wordcloud” package, which is needed to build word clouds.

As we can read from ?wordcloud, we will need to provide the function with a vector of words and a vector of word frequencies. Which function can we apply to allTweets to get a vector of the words in our dataset, which we’ll pass as the first argument to wordcloud()?

library(wordcloud)
## Warning: package 'wordcloud' was built under R version 4.0.3
## Loading required package: RColorBrewer
colSums(allTweets)
##                                                                                                               apple 
##                                                                                                                1297 
##                                                                                                            appstore 
##                                                                                                                   7 
##                                                                                                                best 
##                                                                                                                  12 
##                                                                                                                care 
##                                                                                                                  11 
##                                                                                                            customer 
##                                                                                                                   7 
##                                                                                                                ever 
##                                                                                                                   9 
##                                                                                                                 far 
##                                                                                                                   3 
##                                                                                                            received 
##                                                                                                                   1 
##                                                                                                                 say 
##                                                                                                                  11 
##                                                                                                             service 
##                                                                                                                  15 
##                                                                                                           beautiful 
##                                                                                                                   2 
##                                                                                                            fricking 
##                                                                                                                   1 
##                                                                                                                 ios 
##                                                                                                                  37 
##                                                                                                              smooth 
##                                                                                                                   1 
##                                                                                                          thanxapple 
##                                                                                                                   1 
##                                                                                                                love 
##                                                                                                                  20 
##                                                                                                              iphone 
##                                                                                                                 257 
##                                                                                                            iphone5s 
##                                                                                                                  35 
##                                                                                                              loving 
##                                                                                                                   2 
##                                                                                                                 new 
##                                                                                                                 113 
##                                                                                             pictwittercomxmhjcu4pcb 
##                                                                                                                   1 
##                                                                                                               thank 
##                                                                                                                   8 
##                                                                                                               10min 
##                                                                                                                   1 
##                                                                                                               phone 
##                                                                                                                  75 
##                                                                                                             amazing 
##                                                                                                                   7 
##                                                                                                                 ear 
##                                                                                                                   1 
##                                                                                                          headphones 
##                                                                                                                   6 
##                                                                                                               inear 
##                                                                                                                   1 
##                                                                                                                 ive 
##                                                                                                                   6 
##                                                                                                                pods 
##                                                                                                                   1 
##                                                                                                               sound 
##                                                                                                                   4 
##                                                                                                                 can 
##                                                                                                                  48 
##                                                                                                                cool 
##                                                                                                                   6 
##                                                                                                              finger 
##                                                                                                                   8 
##                                                                                                                make 
##                                                                                                                  36 
##                                                                                                                 omg 
##                                                                                                                   3 
##                                                                                                            passcode 
##                                                                                                                   1 
##                                                                                                               print 
##                                                                                                                   5 
##                                                                                                           purchases 
##                                                                                                                   1 
##                                                                                                                read 
##                                                                                                                   5 
##                                                                                                              unlock 
##                                                                                                                   3 
##                                                                                                             without 
##                                                                                                                   6 
##                                                                                                              always 
##                                                                                                                   8 
##                                                                                                  attributeownership 
##                                                                                                                   1 
##                                                                                                            business 
##                                                                                                                   8 
##                                                                                                             exactly 
##                                                                                                                   3 
##                                                                                                          innovation 
##                                                                                                                   6 
##                                                                                                            marketer 
##                                                                                                                   1 
##                                                                                                           marketing 
##                                                                                                                  11 
##                                                                                                                 one 
##                                                                                                                  35 
##                                                                                                                will 
##                                                                                                                  53 
##                                                                                                                7wow 
##                                                                                                                   1 
##                                                                                                               bravo 
##                                                                                                                   1 
##                                                                                                                cant 
##                                                                                                                  23 
##                                                                                                             checked 
##                                                                                                                   1 
##                                                                                                                 get 
##                                                                                                                  60 
##                                                                                                                just 
##                                                                                                                  60 
##                                                                                                               specs 
##                                                                                                                   1 
##                                                                                                              update 
##                                                                                                                  16 
##                                                                                                                wait 
##                                                                                                                  11 
##                                                                                                                much 
##                                                                                                                  13 
##                                                                                                       phillydvibing 
##                                                                                                                   1 
##                                                                                                                thnx 
##                                                                                                                   1 
##                                                                                                              bloody 
##                                                                                                                   1 
##                                                                                                           brilliant 
##                                                                                                                   2 
##                                                                                                             feature 
##                                                                                                                   8 
##                                                                                                         fingerprint 
##                                                                                                                  27 
##                                                                                                      httptoiinw0o3z 
##                                                                                                                   1 
##                                                                                                              killer 
##                                                                                                                   1 
##                                                                                                             scanner 
##                                                                                                                  10 
##                                                                                                            timesnow 
##                                                                                                                   1 
##                                                                                                             v2vista 
##                                                                                                                   1 
##                                                                                                              almost 
##                                                                                                                   3 
##                                                                                                               brand 
##                                                                                                                   4 
##                                                                                                              demise 
##                                                                                                                   1 
##                                                                                                           fantastic 
##                                                                                                                   2 
##                                                                                                            favorite 
##                                                                                                                   2 
##                                                                                                               going 
##                                                                                                                  16 
##                                                                                                         interesting 
##                                                                                                                   2 
##                                                                                                                many 
##                                                                                                                   7 
##                                                                                                              people 
##                                                                                                                  16 
##                                                                                                                seem 
##                                                                                                                   4 
##                                                                                                               still 
##                                                                                                                  18 
##                                                                                                               whats 
##                                                                                                                   7 
##                                                                                                             willing 
##                                                                                                                   2 
##                                                                                                              bnbuzz 
##                                                                                                                   1 
##                                                                                                              easier 
##                                                                                                                   4 
##                                                                                                                life 
##                                                                                                                   9 
##                                                                                                                made 
##                                                                                                                  10 
##                                                                                                             morning 
##                                                                                                                   5 
##                                                                                                              nookbn 
##                                                                                                                   1 
##                                                                                                           nookstudy 
##                                                                                                                   1 
##                                                                                                             already 
##                                                                                                                  11 
##                                                                                                           christmas 
##                                                                                                                   2 
##                                                                                                                gift 
##                                                                                                                   1 
##                                                                                                               guess 
##                                                                                                                   7 
##                                                                                                            iphone5c 
##                                                                                                                  35 
##                                                                                                             iphones 
##                                                                                                                  30 
##                                                                                                             keynote 
##                                                                                                                   8 
##                                                                                                              latest 
##                                                                                                                   4 
##                                                                                                             watched 
##                                                                                                                   2 
##                                                                                                             calling 
##                                                                                                                   3 
##                                                                                                           correctly 
##                                                                                                                   1 
##                                                                                                               first 
##                                                                                                                   7 
##                                                                                                                gave 
##                                                                                                                   2 
##                                                                                                               store 
##                                                                                                                  36 
##                                                                                                                time 
##                                                                                                                  29 
##                                                                                                                told 
##                                                                                                                   2 
##                                                                                                               wasnt 
##                                                                                                                   4 
##                                                                                                                went 
##                                                                                                                   4 
##                                                                                                                 wow 
##                                                                                                                   9 
##                                                                                                          experience 
##                                                                                                                   4 
##                                                                                                               great 
##                                                                                                                  11 
##                                                                                                                 job 
##                                                                                                                   1 
##                                                                                                           providing 
##                                                                                                                   2 
##                                                                                                           thinkauto 
##                                                                                                                   1 
##                                                                                                               users 
##                                                                                                                   6 
##                                                                                                             convert 
##                                                                                                                   2 
##                                                                                                                 day 
##                                                                                                                  10 
##                                                                                                            galaxys2 
##                                                                                                                   1 
##                                                                                                            iphone4s 
##                                                                                                                   5 
##                                                                                                             swapped 
##                                                                                                                   1 
##                                                                                                                come 
##                                                                                                                  18 
##                                                                                                            november 
##                                                                                                                   1 
##                                                                                                              orange 
##                                                                                                                   1 
##                                                                                                       orangehelpers 
##                                                                                                                   1 
##                                                                                                             upgrade 
##                                                                                                                   9 
##                                                                                                             colored 
##                                                                                                                   1 
##                                                                                                              colors 
##                                                                                                                   5 
##                                                                                                               comes 
##                                                                                                                   5 
##                                                                                                                till 
##                                                                                                                   1 
##                                                                                                                 fan 
##                                                                                                                   3 
##                                                                                                    httpbitly18ybjlq 
##                                                                                                                   1 
##                                                                                                                lots 
##                                                                                                                   1 
##                                                                                                     lovegreatdesign 
##                                                                                                                   1 
##                                                                                                             reasons 
##                                                                                                                   1 
##                                                                                                               video 
##                                                                                                                  11 
##                                                                                                            watching 
##                                                                                                                   5 
##                                                                                                             whether 
##                                                                                                                   1 
##                                                                                                               worth 
##                                                                                                                   5 
##                                                                                                               youre 
##                                                                                                                  13 
##                                                                                                            features 
##                                                                                                                   4 
##                                                                                                          impressive 
##                                                                                                                   4 
##                                                                                                                 now 
##                                                                                                                  46 
##                                                                                                         recognition 
##                                                                                                                   3 
##                                                                                                               thats 
##                                                                                                                  17 
##                                                                                                             awesome 
##                                                                                                                   8 
##                                                                                                          blackberry 
##                                                                                                                   9 
##                                                                                                    clickitandlickit 
##                                                                                                                   1 
##                                                                                                         jimmykimmel 
##                                                                                                                   2 
##                                                                                                           kuqogroup 
##                                                                                                                   1 
##                                                                                                        unbelievably 
##                                                                                                                   1 
##                                                                                                             earpods 
##                                                                                                                   1 
##                                                                                                              thanks 
##                                                                                                                  24 
##                                                                                                           champagne 
##                                                                                                                   3 
##                                                                                                              colour 
##                                                                                                                   3 
##                                                                                                                 luv 
##                                                                                                                   2 
##                                                                                                              reader 
##                                                                                                                   2 
##                                                                                                         demonstrate 
##                                                                                                                   1 
##                                                                                                     explainevrythng 
##                                                                                                                   1 
##                                                                                                             factors 
##                                                                                                                   1 
##                                                                                                             student 
##                                                                                                                   1 
##                                                                                                       understanding 
##                                                                                                                   1 
##                                                                                                                used 
##                                                                                                                   5 
##                                                                                                               arent 
##                                                                                                                   7 
##                                                                                                         brodyknibbs 
##                                                                                                                   1 
##                                                                                                             company 
##                                                                                                                  10 
##                                                                                                                haha 
##                                                                                                                   4 
##                                                                                                                mint 
##                                                                                                                   1 
##                                                                                                                 top 
##                                                                                                                   2 
##                                                                                                                back 
##                                                                                                                  20 
##                                                                                                                 yaw 
##                                                                                                                   1 
##                                                                                                             anyones 
##                                                                                                                   1 
##                                                                                                            courtesy 
##                                                                                                                   1 
##                                                                                                               found 
##                                                                                                                   4 
##                                                                                                                maps 
##                                                                                                                   4 
##                                                                                                                said 
##                                                                                                                   7 
##                                                                                                               today 
##                                                                                                                  13 
##                                                                                                                 way 
##                                                                                                                  13 
##                                                                                                                work 
##                                                                                                                  13 
##                                                                                                               alarm 
##                                                                                                                   4 
##                                                                                                                dear 
##                                                                                                                  15 
##                                                                                                             default 
##                                                                                                                   1 
##                                                                                                         goodmorning 
##                                                                                                                   1 
##                                                                                                            ringtone 
##                                                                                                                   1 
##                                                                                                              camera 
##                                                                                                                   5 
##                                                                                                                good 
##                                                                                                                  16 
##                                                                                                               never 
##                                                                                                                  10 
##                                                                                                             noticed 
##                                                                                                                   1 
##                                                                                             pictwittercom0z6zd8fymk 
##                                                                                                                   1 
##                                                                                                                 pug 
##                                                                                                                   1 
##                                                                                                               added 
##                                                                                                                   3 
##                                                                                                                 app 
##                                                                                                                  39 
##                                                                                                             appletv 
##                                                                                                                   4 
##                                                                                                               house 
##                                                                                                                   2 
##                                                                                                               leave 
##                                                                                                                   2 
##                                                                                                                 may 
##                                                                                                                   5 
##                                                                                                                 sec 
##                                                                                                                   2 
##                                                                                                           watchespn 
##                                                                                                                   1 
##                                                                                             pictwittercomx5zy21xfi3 
##                                                                                                                   1 
##                                                                                                            products 
##                                                                                                                  10 
##                                                                                                             drawing 
##                                                                                                                   1 
##                                                                                                                 mac 
##                                                                                                                   8 
##                                                                                             pictwittercomw9ckpcey0r 
##                                                                                                                   1 
##                                                                                                               soooo 
##                                                                                                                   3 
##                                                                                                             android 
##                                                                                                                  23 
##                                                                                                             getting 
##                                                                                                                  11 
##                                                                                                              pulled 
##                                                                                                                   2 
##                                                                                                                 saw 
##                                                                                                                   1 
##                                                                                                            thinking 
##                                                                                                                   2 
##                                                                                                             created 
##                                                                                                                   3 
##                                                                                                           extensive 
##                                                                                                                   1 
##                                                                                                          innovative 
##                                                                                                                   3 
##                                                                                                         jasonreiner 
##                                                                                                                   2 
##                                                                                                             product 
##                                                                                                                   6 
##                                                                                                            research 
##                                                                                                                   1 
##                                                                                                        trendsetters 
##                                                                                                                   1 
##                                                                                                              damage 
##                                                                                                                   1 
##                                                                                                             dropped 
##                                                                                                                   4 
##                                                                                                             flights 
##                                                                                                                   1 
##                                                                                                              stairs 
##                                                                                                                   1 
##                                                                                                                 two 
##                                                                                                                   7 
##                                                                                                              wooden 
##                                                                                                                   1 
##                                                                                                                help 
##                                                                                                                  14 
##                                                                                                                away 
##                                                                                                                   6 
##                                                                                                         functioning 
##                                                                                                                   2 
##                                                                                                                hour 
##                                                                                                                   5 
##                                                                                                                ipad 
##                                                                                                                  88 
##                                                                                                             storean 
##                                                                                                                   1 
##                                                                                                        traceyliddle 
##                                                                                                                   1 
##                                                                                                            continue 
##                                                                                                                   5 
##                                                                                                                easy 
##                                                                                                                   1 
##                                                                                                                macs 
##                                                                                                                   2 
##                                                                                                               makes 
##                                                                                                                   9 
##                                                                                             pictwittercomlga2kaxa4b 
##                                                                                                                   1 
##                                                                                                            transfer 
##                                                                                                                   2 
##                                                                                                           mentioned 
##                                                                                                                   1 
##                                                                                                               nokia 
##                                                                                                                  14 
##                                                                                                             nokiauk 
##                                                                                                                   4 
##                                                                                                            sentence 
##                                                                                                                   1 
##                                                                                                            thanking 
##                                                                                                                   1 
##                                                                                                           hopefully 
##                                                                                                                   3 
##                                                                                                              mfayax 
##                                                                                                                   1 
##                                                                                         httpinstagramcomappsolution 
##                                                                                                                   1 
##                                                                                                           instagram 
##                                                                                                                   2 
##                                                                                                      picturesvideos 
##                                                                                                                   1 
##                                                                                             pictwittercomqqdzqe8s4f 
##                                                                                                                   1 
##                                                                                                             profile 
##                                                                                                                   1 
##                                                                                                            stunning 
##                                                                                                                   2 
##                                                                                                               world 
##                                                                                                                   6 
##                                                                                                               faith 
##                                                                                                                   1 
##                                                                                                      httpowly22fbs4 
##                                                                                                                   1 
##                                                                                                            restored 
##                                                                                                                   1 
##                                                                                                            suddenly 
##                                                                                                                   1 
##                                                                                                              charge 
##                                                                                                                   7 
##                                                                                                                free 
##                                                                                                                  14 
##                                                                                                              giving 
##                                                                                                                   1 
##                                                                                                              imovie 
##                                                                                                                   4 
##                                                                                                              iphoto 
##                                                                                                                  10 
##                                                                                                               iwork 
##                                                                                                                   3 
##                                                                                                              missed 
##                                                                                                                   7 
##                                                                                                                move 
##                                                                                                                   4 
##                                                                                                              owners 
##                                                                                                                   1 
##                                                                                                             totally 
##                                                                                                                   3 
##                                                                                              fingerprintsrecognitom 
##                                                                                                                   1 
##                                                                                                              pretty 
##                                                                                                                   4 
##                                                                                                               seems 
##                                                                                                                   6 
##                                                                                                            concepts 
##                                                                                                                   1 
##                                                                                                               cycle 
##                                                                                                                   1 
##                                                                                                                huge 
##                                                                                                                   5 
##                                                                                                            improved 
##                                                                                                                   4 
##                                                                                                                live 
##                                                                                                                   4 
##                                                                                             pictwittercom4vkivk0s0y 
##                                                                                                                   1 
##                                                                                                              review 
##                                                                                                                   2 
##                                                                                                              shapes 
##                                                                                                                   1 
##                                                                                                              snapto 
##                                                                                                                   1 
##                                                                                                              stacks 
##                                                                                                                   1 
##                                                                                                              amount 
##                                                                                                                   2 
##                                                                                                            macbooks 
##                                                                                                                   1 
##                                                                                                           starbucks 
##                                                                                                                   1 
##                                                                                                                well 
##                                                                                                                  22 
##                                                                                                                gold 
##                                                                                                                  12 
##                                                                                                          ibrooklynb 
##                                                                                                                   8 
##                                                                                                                 ftw 
##                                                                                                                   1 
##                                                                                                             windows 
##                                                                                                                   4 
##                                                                                                       automatically 
##                                                                                                                   1 
##                                                                                                            brighter 
##                                                                                                                   1 
##                                                                                                                code 
##                                                                                                                   2 
##                                                                                                            flawless 
##                                                                                                                   1 
##                                                                                                                gets 
##                                                                                                                   4 
##                                                                                                                 ill 
##                                                                                                                   7 
##                                                                                                                open 
##                                                                                                                   1 
##                                                                                                            passbook 
##                                                                                                                   1 
##                                                                                                            scanning 
##                                                                                                                   1 
##                                                                                                              screen 
##                                                                                                                  10 
##                                                                                                               stick 
##                                                                                                                   4 
##                                                                                                          absolutely 
##                                                                                                                   4 
##                                                                                                            applenws 
##                                                                                                                   3 
##                                                                                                         appletweets 
##                                                                                                                   5 
##                                                                                                               break 
##                                                                                                                   5 
##                                                                                                          incredible 
##                                                                                                                   1 
##                                                                                                       ios7everybody 
##                                                                                                                   1 
##                                                                                                                jail 
##                                                                                                                   2 
##                                                                                                               kills 
##                                                                                                                   1 
##                                                                                                           operating 
##                                                                                                                   2 
##                                                                                                               ready 
##                                                                                                                   3 
##                                                                                                              system 
##                                                                                                                   4 
##                                                                                                            againthe 
##                                                                                                                   1 
##                                                                                                                done 
##                                                                                                                  11 
##                                                                                                            freaking 
##                                                                                                                  14 
##                                                                                                               gonna 
##                                                                                                                   9 
##                                                                                                                sick 
##                                                                                                                   3 
##                                                                                                                 key 
##                                                                                                                   4 
##                                                                                                            lafond66 
##                                                                                                                   2 
##                                                                                                           mallow610 
##                                                                                                                   2 
##                                                                                                                next 
##                                                                                                                  17 
##                                                                                                             nothing 
##                                                                                                                   9 
##                                                                                                              recent 
##                                                                                                                   3 
##                                                                                                        upgradebrand 
##                                                                                                                   1 
##                                                                                                           usability 
##                                                                                                                   1 
##                                                                                                                2001 
##                                                                                                                   1 
##                                                                                                         hatewindows 
##                                                                                                                   1 
##                                                                                                             instead 
##                                                                                                                  12 
##                                                                                                             macbook 
##                                                                                                                  10 
##                                                                                                                 pro 
##                                                                                                                   7 
##                                                                                                              reason 
##                                                                                                                   3 
##                                                                                                     stupidmicrosoft 
##                                                                                                                   1 
##                                                                                                              alarms 
##                                                                                                                   1 
##                                                                                                                dont 
##                                                                                                                  50 
##                                                                                                             finally 
##                                                                                                                   5 
##                                                                                                                hard 
##                                                                                                                   3 
##                                                                                                          introduces 
##                                                                                                                   1 
##                                                                                                           ringtones 
##                                                                                                                   1 
##                                                                                                                suck 
##                                                                                                                   5 
##                                                                                                              friday 
##                                                                                                                   4 
##                                                                                                                 got 
##                                                                                                                  13 
##                                                                                                               legit 
##                                                                                                                   1 
##                                                                                                            repaired 
##                                                                                                                   2 
##                                                                                                         replacement 
##                                                                                                                   1 
##                                                                                                                sent 
##                                                                                                                   2 
##                                                                                                            straight 
##                                                                                                                   5 
##                                                                                                           wednesday 
##                                                                                                                   1 
##                                                                                                            complete 
##                                                                                                                   3 
##                                                                                                              iradio 
##                                                                                                                   1 
##                                                                                             pictwittercomgqg5xusyf7 
##                                                                                                                   1 
##                                                                                                             article 
##                                                                                                                   5 
##                                                                                                               aside 
##                                                                                                                   1 
##                                                                                                        fastcodesign 
##                                                                                                                   1 
##                                                                                                       httpowlyovszn 
##                                                                                                                   1 
##                                                                                                           hyperbole 
##                                                                                                                   1 
##                                                                                                              simply 
##                                                                                                                   3 
##                                                                                                                 via 
##                                                                                                                  20 
##                                                                                                              anyone 
##                                                                                                                  19 
##                                                                                                              around 
##                                                                                                                   3 
##                                                                                                           companies 
##                                                                                                                   4 
##                                                                                                               creep 
##                                                                                                                   1 
##                                                                                                                else 
##                                                                                                                   4 
##                                                                                                               least 
##                                                                                                                   3 
##                                                                                                                 let 
##                                                                                                                  15 
##                                                                                                                okay 
##                                                                                                                   2 
##                                                                                                             palling 
##                                                                                                                   1 
##                                                                                                                stop 
##                                                                                                                  11 
##                                                                                                            together 
##                                                                                                                   6 
##                                                                                                         beautifully 
##                                                                                                                   1 
##                                                                                                                ears 
##                                                                                                                   2 
##                                                                                                    httpbitly17pdiv1 
##                                                                                                                   1 
##                                                                                                        jillmartin77 
##                                                                                                                   1 
##                                                                                                               music 
##                                                                                                                   6 
##                                                                                                             plastic 
##                                                                                                                  10 
##                                                                                                                 see 
##                                                                                                                  11 
##                                                                                                    unapologetically 
##                                                                                                                   1 
##                                                                                                              better 
##                                                                                                                  20 
##                                                                                                                 cuz 
##                                                                                                                   2 
##                                                                                                             iphonec 
##                                                                                                                   1 
##                                                                                                               loved 
##                                                                                                                   2 
##                                                                                                                name 
##                                                                                                                   1 
##                                                                                                              design 
##                                                                                                                   7 
##                                                                                                                fell 
##                                                                                                                   1 
##                                                                                                                like 
##                                                                                                                  45 
##                                                                                                                 lot 
##                                                                                                                   3 
##                                                                                                               older 
##                                                                                                                   2 
##                                                                                                          technology 
##                                                                                                                   7 
##                                                                                                               wanna 
##                                                                                                                   4 
##                                                                                                             working 
##                                                                                                                   8 
##                                                                                                                 big 
##                                                                                                                  10 
##                                                                                                             content 
##                                                                                                                   2 
##                                                                                                            drumroll 
##                                                                                                                   1 
##                                                                                                          happydance 
##                                                                                                                   1 
##                                                                                                             joining 
##                                                                                                                   1 
##                                                                                                             lrwblog 
##                                                                                                                   1 
##                                                                                                                news 
##                                                                                                                  14 
##                                                                                                              please 
##                                                                                                                  21 
##                                                                                               redesignhttpowlyonazd 
##                                                                                                                   1 
##                                                                                                             samsung 
##                                                                                                                  24 
##                                                                                                                blog 
##                                                                                                                   1 
##                                                                                                                send 
##                                                                                                                   8 
##                                                                                                               wants 
##                                                                                                                   4 
##                                                                                                             battery 
##                                                                                                                  18 
##                                                                                             pictwittercomxwqjedhsvt 
##                                                                                                                   1 
##                                                                                                               years 
##                                                                                                                   4 
##                                                                                                              choose 
##                                                                                                                   1 
##                                                                                                               green 
##                                                                                                                   5 
##                                                                                                                guys 
##                                                                                                                  11 
##                                                                                                         whitesilver 
##                                                                                                                   3 
##                                                                                                            birthday 
##                                                                                                                   1 
##                                                                                                                fake 
##                                                                                                                   2 
##                                                                                                               gifts 
##                                                                                                                   1 
##                                                                                                             married 
##                                                                                                                   1 
##                                                                                                         registering 
##                                                                                                                   1 
##                                                                                                            registry 
##                                                                                                                   1 
##                                                                                                              things 
##                                                                                                                   7 
##                                                                                                httptwitpiccomdd6xjw 
##                                                                                                                   1 
##                                                                                                      itunesfestival 
##                                                                                                                   4 
##                                                                                             pictwittercomlbu9diufrf 
##                                                                                                                   1 
##                                                                                                            entering 
##                                                                                                                   1 
##                                                                                                          flashlight 
##                                                                                                                   1 
##                                                                                                              genius 
##                                                                                                                   7 
##                                                                                                                ios7 
##                                                                                                                  24 
##                                                                                                                know 
##                                                                                                                  18 
##                                                                                                            password 
##                                                                                                                   4 
##                                                                                                              simple 
##                                                                                                                   7 
##                                                                                                               ahead 
##                                                                                                                   1 
##                                                                                                              future 
##                                                                                                                   4 
##                                                                                                            identity 
##                                                                                                                   3 
##                                                                                                               leaps 
##                                                                                                                   1 
##                                                                                                          management 
##                                                                                                                   1 
##                                                                                                                 mdm 
##                                                                                                                   1 
##                                                                                                                 mim 
##                                                                                                                   1 
##                                                                                                              mobile 
##                                                                                                                  15 
##                                                                                                               stuck 
##                                                                                                                   2 
##                                                                                                      6monthlifespan 
##                                                                                                                   1 
##                                                                                                               every 
##                                                                                                                  15 
##                                                                                                              laptop 
##                                                                                                                   4 
##                                                                                                           microsoft 
##                                                                                                                  26 
##                                                                                                                days 
##                                                                                                                   8 
##                                                                                                               hands 
##                                                                                                                   1 
##                                                                                             pictwittercomxwr5hvnjyc 
##                                                                                                                   1 
##                                                                                                       september20th 
##                                                                                                                   1 
##                                                                                                            believer 
##                                                                                                                   1 
##                                                                                                         tvmattscott 
##                                                                                                                   1 
##                                                                                                               entry 
##                                                                                                                   1 
##                                                                                                                glad 
##                                                                                                                   3 
##                                                                                                                itll 
##                                                                                                                   1 
##                                                                                                               level 
##                                                                                                                   3 
##                                                                                                               light 
##                                                                                                                   3 
##                                                                                                           megapixel 
##                                                                                                                   1 
##                                                                                                               outdo 
##                                                                                                                   1 
##                                                                                                         sensitivity 
##                                                                                                                   1 
##                                                                                                            skipping 
##                                                                                                                   1 
##                                                                                                                slrs 
##                                                                                                                   1 
##                                                                                                                 war 
##                                                                                                                   1 
##                                                                                                      fireandice5935 
##                                                                                                                   1 
##                                                                                                               force 
##                                                                                                                   3 
##                                                                                                        johanbarnard 
##                                                                                                                   3 
##                                                                                                              strong 
##                                                                                                                   1 
##                                                                                                               tempt 
##                                                                                                                   1 
##                                                                                                                 tho 
##                                                                                                                   7 
##                                                                                                                apps 
##                                                                                                                  15 
##                                                                                                          coremotion 
##                                                                                                                   1 
##                                                                                                             empower 
##                                                                                                                   1 
##                                                                                                             fitness 
##                                                                                                                   1 
##                                                                                                          generation 
##                                                                                                                   8 
##                                                                                                              health 
##                                                                                                                   1 
##                                                                                                                says 
##                                                                                                                   9 
##                                                                                                            actually 
##                                                                                                                   8 
##                                                                                                        announcement 
##                                                                                                                   6 
##                                                                                                             numbers 
##                                                                                                                   3 
##                                                                                                               pages 
##                                                                                                                   4 
##                                                                                                               thing 
##                                                                                                                   8 
##                                                                                                                 180 
##                                                                                                                   1 
##                                                                                                                 bad 
##                                                                                                                   5 
##                                                                                                         bubblemania 
##                                                                                                                   5 
##                                                                                                         laurenjessa 
##                                                                                                                   4 
##                                                                                                                lost 
##                                                                                                                   6 
##                                                                                                           lxforever 
##                                                                                                                   4 
##                                                                                                            replaced 
##                                                                                                                   2 
##                                                                                                            spotwent 
##                                                                                                                   1 
##                                                                                                              beauty 
##                                                                                                                   1 
##                                                                                                             classes 
##                                                                                                                   1 
##                                                                                                    experienceadditn 
##                                                                                                                   1 
##                                                                                                  industryincredible 
##                                                                                                                   1 
##                                                                                                             instore 
##                                                                                                                   2 
##                                                                                                              online 
##                                                                                                                   3 
##                                                                                             pictwittercomjagqqkjmr3 
##                                                                                                                   1 
##                                                                                                              retail 
##                                                                                                                   3 
##                                                                                                             sephora 
##                                                                                                                   1 
##                                                                                                         applereason 
##                                                                                                                   1 
##                                                                                                         generations 
##                                                                                                                   1 
##                                                                                                       manufacturers 
##                                                                                                                   1 
##                                                                                                                none 
##                                                                                                                   2 
##                                                                                                             rolling 
##                                                                                                                   1 
##                                                                                                               smart 
##                                                                                                                   6 
##                                                                                                            software 
##                                                                                                                   4 
##                                                                                                             anythng 
##                                                                                                                   1 
##                                                                                                               bring 
##                                                                                                                   5 
##                                                                                                               cakes 
##                                                                                                                   1 
##                                                                                                                 dat 
##                                                                                                                   2 
##                                                                                                                dint 
##                                                                                                                   1 
##                                                                                                                 hot 
##                                                                                                                   2 
##                                                                                                                sell 
##                                                                                                                   7 
##                                                                                                                 wen 
##                                                                                                                   2 
##                                                                                                                 wil 
##                                                                                                                   1 
##                                                                                                               check 
##                                                                                                                   4 
##                                                                                             httpforbitlyscaleboxapp 
##                                                                                                                   2 
##                                                                                                            inviting 
##                                                                                                                   1 
##                                                                                                              itunes 
##                                                                                                                  79 
##                                                                                                         itunesmusic 
##                                                                                                                   2 
##                                                                                                           musicians 
##                                                                                                                   1 
##                                                                                                         scaleboxapp 
##                                                                                                                   2 
##                                                                                                                home 
##                                                                                                                   4 
##                                                                                                              office 
##                                                                                                                   3 
##                                                                                                                 pen 
##                                                                                                                   1 
##                                                                                             pictwittercomu1ifcddhei 
##                                                                                                                   1 
##                                                                                                             vintage 
##                                                                                                                   1 
##                                                                                                 applestoreamsterdam 
##                                                                                                                   1 
##                                                                                                                 buy 
##                                                                                                                  17 
##                                                                                                               didnt 
##                                                                                                                  12 
##                                                                                                           geniusbar 
##                                                                                                                   1 
##                                                                                                           something 
##                                                                                                                   8 
##                                                                                                                spot 
##                                                                                                                   2 
##                                                                                                                 tks 
##                                                                                                                   1 
##                                                                                                                 yet 
##                                                                                                                  13 
##                                                                                                             beyonce 
##                                                                                                                   2 
##                                                                                                              bphone 
##                                                                                                                   1 
##                                                                                             pictwittercomsj86urqvm8 
##                                                                                                                   1 
##                                                                                                           choicenot 
##                                                                                                                   1 
##                                                                                                               color 
##                                                                                                                  11 
##                                                                                                                 due 
##                                                                                                                   1 
##                                                                                                                ehhh 
##                                                                                                                   1 
##                                                                                                                sure 
##                                                                                                                  15 
##                                                                                                          thoughgold 
##                                                                                                                   1 
##                                                                                                          upgradethe 
##                                                                                                                   1 
##                                                                                                             whelpim 
##                                                                                                                   1 
##                                                                                                           advantage 
##                                                                                                                   1 
##                                                                                                                 api 
##                                                                                                                   1 
##                                                                                                           biometric 
##                                                                                                                   2 
##                                                                                                                devs 
##                                                                                                                   1 
##                                                                                                             excited 
##                                                                                                                   4 
##                                                                                                              hoping 
##                                                                                                                   2 
##                                                                                                         introducing 
##                                                                                                                   3 
##                                                                                                            released 
##                                                                                                                   6 
##                                                                                                            security 
##                                                                                                                   6 
##                                                                                                                soon 
##                                                                                                                   6 
##                                                                                                                take 
##                                                                                                                   8 
##                                                                                                             touchid 
##                                                                                                                   8 
##                                                                                                                dead 
##                                                                                                                   2 
##                                                                                                                lion 
##                                                                                                                   1 
##                                                                                                            mountain 
##                                                                                                                   1 
##                                                                                                               saved 
##                                                                                                                   3 
##                                                                                                                 ssd 
##                                                                                                                   1 
##                                                                                                            upgraded 
##                                                                                                                   2 
##                                                                                                              follow 
##                                                                                                                   8 
##                                                                                                                asap 
##                                                                                                                   1 
##                                                                                            courtsideassistappforios 
##                                                                                                                   1 
##                                                                                                           currently 
##                                                                                                                   1 
##                                                                                                             support 
##                                                                                                                  10 
##                                                                                                             waiting 
##                                                                                                                   6 
##                                                                                                              coming 
##                                                                                                                   9 
##                                                                                                                idea 
##                                                                                                                   9 
##                                                                                                            kickbutt 
##                                                                                                                   1 
##                                                                                                        preinstalled 
##                                                                                                                   1 
##                                                                                                        simonmoeller 
##                                                                                                                   1 
##                                                                                                              subway 
##                                                                                                                   1 
##                                                                                                             surfers 
##                                                                                                                   1 
##                                                                                                         achievement 
##                                                                                                                   1 
##                                                                                                              builds 
##                                                                                                                   1 
##                                                                                                       httpowlyoo0u0 
##                                                                                                                   1 
##                                                                                                           ngerprint 
##                                                                                                                   1 
##                                                                                                              sensor 
##                                                                                                                   1 
##                                                                                                               touch 
##                                                                                                                   6 
##                                                                                                             filsfan 
##                                                                                                                   2 
##                                                                                                            rockstar 
##                                                                                                                   1 
##                                                                                                         thehottspot 
##                                                                                                                   3 
##                                                                                                      themixxhangout 
##                                                                                                                   3 
##                                                                                                        themixxradio 
##                                                                                                                   2 
##                                                                                                       astrologyzone 
##                                                                                                                   1 
##                                                                                                          commitment 
##                                                                                                                   1 
##                                                                                                             forward 
##                                                                                                                   2 
##                                                                                                             looking 
##                                                                                                                   6 
##                                                                                                              pushed 
##                                                                                                                   1 
##                                                                                                                week 
##                                                                                                                   7 
##                                                                                                            burberry 
##                                                                                                                   9 
##                                                                                                 httponmashto1bbfsca 
##                                                                                                                   1 
##                                                                                                            mashable 
##                                                                                                                   2 
##                                                                                                         partnership 
##                                                                                                                   1 
##                                                                                                              runway 
##                                                                                                                   3 
##                                                                                                              shoots 
##                                                                                                                   1 
##                                                                                                                show 
##                                                                                                                   6 
##                                                                                                              teaser 
##                                                                                                                   3 
##                                                                                                          capability 
##                                                                                                                   1 
##                                                                                                              forbid 
##                                                                                                                   1 
##                                                                                                                 god 
##                                                                                                                   5 
##                                                                                                           improving 
##                                                                                                                   2 
##                                                                                                            multiple 
##                                                                                                                   1 
##                                                                                                             network 
##                                                                                                                   2 
##                                                                                                              offers 
##                                                                                                                   2 
##                                                                                                           resources 
##                                                                                                                   1 
##                                                                                                               spend 
##                                                                                                                   1 
##                                                                                                              button 
##                                                                                                                   5 
##                                                                                                         customernot 
##                                                                                                                   1 
##                                                                                                                data 
##                                                                                                                  11 
##                                                                                                                died 
##                                                                                                                   3 
##                                                                                                               happy 
##                                                                                                                   6 
##                                                                                                              lovely 
##                                                                                                                   1 
##                                                                                                              policy 
##                                                                                                                   1 
##                                                                                                                 ret 
##                                                                                                                   1 
##                                                                                                               sleep 
##                                                                                                                   2 
##                                                                                                              slowly 
##                                                                                                                   1 
##                                                                                                             devices 
##                                                                                                                  17 
##                                                                                                             helping 
##                                                                                                                   2 
##                                                                                                           mobilebiz 
##                                                                                                                   2 
##                                                                                                             mobiles 
##                                                                                                                   2 
##                                                                                                             quicker 
##                                                                                                                   5 
##                                                                                                               raise 
##                                                                                                                   2 
##                                                                                                             speedux 
##                                                                                                                   2 
##                                                                                                          thedimassa 
##                                                                                                                   1 
##                                                                                                           volleying 
##                                                                                                                   2 
##                                                                                                                 yes 
##                                                                                                                   7 
##                                                                                                               abrsm 
##                                                                                                                   1 
##                                                                                                           excellent 
##                                                                                                                   3 
##                                                                                                            musician 
##                                                                                                                   1 
##                                                                                                       onlyclassical 
##                                                                                                                   1 
##                                                                                                               piano 
##                                                                                                                   1 
##                                                                                                              violin 
##                                                                                                                   1 
##                                                                                                     homeimprovement 
##                                                                                                                   2 
##                                                                                                          homeowners 
##                                                                                                                   2 
##                                                                                                               tools 
##                                                                                                                   2 
##                                                                                                           undefined 
##                                                                                                                   2 
##                                                                                                              behind 
##                                                                                                                   2 
##                                                                                                             couldnt 
##                                                                                                                   4 
##                                                                                                          innovating 
##                                                                                                                   2 
##                                                                                             pictwittercoms3rzjzyssj 
##                                                                                                                   1 
##                                                                                                               think 
##                                                                                                                  26 
##                                                                                                               wrong 
##                                                                                                                   3 
##                                                                                                            becoming 
##                                                                                                                   1 
##                                                                                                                chip 
##                                                                                                                   4 
##                                                                                                          dominating 
##                                                                                                                   1 
##                                                                                    httpsmgtechmediacompagesapplehtm 
##                                                                                                                   1 
##                                                                                                                talk 
##                                                                                                                   3 
##                                                                                                              apples 
##                                                                                                                  32 
##                                                                                                            briefing 
##                                                                                                                   1 
##                                                                                                         development 
##                                                                                                                   3 
##                                                                                                             hosting 
##                                                                                                                   1 
##                                                                                                               learn 
##                                                                                                                   1 
##                                                                                          navneetsainistratixcorpcom 
##                                                                                                                   1 
##                                                                                                                 oct 
##                                                                                                                   1 
##                                                                                                             stratix 
##                                                                                                                   1 
##                                                                                                             concept 
##                                                                                                                   2 
##                                                                                                              loveit 
##                                                                                                                   1 
##                                                                                                    mobilerevolution 
##                                                                                                                   1 
##                                                                                                      phoneblockscom 
##                                                                                                                   1 
##                                                                                                               right 
##                                                                                                                  12 
##                                                                                                                want 
##                                                                                                                  23 
##                                                                                                             fanboys 
##                                                                                                                   2 
##                                                                                                               flash 
##                                                                                                                   4 
##                                                                                                         greeniphone 
##                                                                                                                   1 
##                                                                                                               heart 
##                                                                                                                   2 
##                                                                                                              little 
##                                                                                                                   4 
##                                                                                                          recaptured 
##                                                                                                                   1 
##                                                                                                           yesplease 
##                                                                                                                   1 
##                                                                                                       entertainment 
##                                                                                                                   1 
##                                                                                                            problems 
##                                                                                                                   3 
##                                                                                                                tech 
##                                                                                                                  13 
##                                                                                                             fashion 
##                                                                                                                   4 
##                                                                                                                glam 
##                                                                                                                   1 
##                                                                                                                goes 
##                                                                                                                   3 
##                                                                                                                high 
##                                                                                                                   5 
##                                                                                                    httpbitly160el6m 
##                                                                                                                   1 
##                                                                                                              luxury 
##                                                                                                                   1 
##                                                                                                             partner 
##                                                                                                                   1 
##                                                                                                             promote 
##                                                                                                                   1 
##                                                                                                          smartwatch 
##                                                                                                                   2 
##                                                                                                              2000ad 
##                                                                                                                   1 
##                                                                                                             approve 
##                                                                                                                   1 
##                                                                                                               dredd 
##                                                                                                                   1 
##                                                                                                              slaine 
##                                                                                                                   1 
##                                                                                                           submitted 
##                                                                                                                   2 
##                                                                                                                 ago 
##                                                                                                                   2 
##                                                                                                            anodized 
##                                                                                                                   1 
##                                                                                                                darn 
##                                                                                                                   7 
##                                                                                                              finish 
##                                                                                                                   2 
##                                                                                                                secs 
##                                                                                                                   1 
##                                                                                                     airwaysmagazine 
##                                                                                                                   2 
##                                                                                                     boeingairplanes 
##                                                                                                                   2 
##                                                                                                         fascinating 
##                                                                                                                   1 
##                                                                                                           desperate 
##                                                                                                                   4 
##                                                                                                                need 
##                                                                                                                  29 
##                                                                                                             tonight 
##                                                                                                                   1 
##                                                                                                           basically 
##                                                                                                                   4 
##                                                                                                               gents 
##                                                                                                                   1 
##                                                                                                             hottest 
##                                                                                                                   1 
##                                                                                                               nerds 
##                                                                                                                   2 
##                                                                                                                give 
##                                                                                                                  15 
##                                                                                                             jealous 
##                                                                                                                   2 
##                                                                                                             putting 
##                                                                                                                   3 
##                                                                                                            preorder 
##                                                                                                                  12 
##                                                                                             pictwittercomhlvxntisug 
##                                                                                                                   1 
##                                                                                                             iphone5 
##                                                                                                                   7 
##                                                                                                                last 
##                                                                                                                   7 
##                                                                                                             weekend 
##                                                                                                                   1 
##                                                                                                              happen 
##                                                                                                                   6 
##                                                                                                   httpbuffly17swtoc 
##                                                                                                                   1 
##                                                                                                                look 
##                                                                                                                  17 
##                                                                                                       mashablevideo 
##                                                                                                                   1 
##                                                                                                               black 
##                                                                                                                  12 
##                                                                                                            commerce 
##                                                                                                                   1 
##                                                                                                              google 
##                                                                                                                  27 
##                                                                                                       httpowlyoqcgb 
##                                                                                                                   1 
##                                                                                                                lead 
##                                                                                                                   1 
##                                                                                                              reigns 
##                                                                                                                   1 
##                                                                                                         embarassing 
##                                                                                                                   1 
##                                                                                                            nowadays 
##                                                                                                                   1 
##                                                                                                             chipset 
##                                                                                                                   1 
##                                                                                                          engineered 
##                                                                                                                   1 
##                                                                                                     innovatinghello 
##                                                                                                                   1 
##                                                                                                              looked 
##                                                                                                                   1 
##                                                                                                                 ali 
##                                                                                                                   1 
##                                                                                                            muhammad 
##                                                                                                                   1 
##                                                                                             pictwittercomuhypsr33vw 
##                                                                                                                   1 
##                                                                                                         thegreatest 
##                                                                                                                   1 
##                                                                                                      thinkdifferent 
##                                                                                                                   1 
##                                                                                                              dreams 
##                                                                                                                   1 
##                                                                                                         infiltrated 
##                                                                                                                   1 
##                                                                                                            launched 
##                                                                                                                   1 
##                                                                                                                 hey 
##                                                                                                                  16 
##                                                                                                          iphonesetc 
##                                                                                                                   1 
##                                                                                                              jarvis 
##                                                                                                                   3 
##                                                                                                          somedayvia 
##                                                                                                                   1 
##                                                                                                             updates 
##                                                                                                                   3 
##                                                                                                                cmon 
##                                                                                                                   2 
##                                                                                                             giddyup 
##                                                                                                                   1 
##                                                                                                            homegirl 
##                                                                                                                   1 
##                                                                                                    ihavethefirstone 
##                                                                                                                   1 
##                                                                                                             release 
##                                                                                                                  15 
##                                                                                                               jesus 
##                                                                                                                   4 
##                                                                                             pictwittercomsjvvjka3sd 
##                                                                                                                   1 
##                                                                                                                 1st 
##                                                                                                                   1 
##                                                                                                                 bit 
##                                                                                                                   9 
##                                                                                                                dstv 
##                                                                                                                   1 
##                                                                                             pictwittercomxshi3gqlku 
##                                                                                                                   1 
##                                                                                                                 sad 
##                                                                                                                   4 
##                                                                                                               suits 
##                                                                                                                   1 
##                                                                                                             eldaily 
##                                                                                                                   1 
##                                                                                                       httpowlyor69m 
##                                                                                                                   1 
##                                                                                                            launches 
##                                                                                                                   1 
##                                                                                                             program 
##                                                                                                                   1 
##                                                                                                           recycling 
##                                                                                                                   1 
##                                                                                                             bestbuy 
##                                                                                                                   1 
##                                                                                                      blakegrahampga 
##                                                                                                                   1 
##                                                                                                                gone 
##                                                                                                                   4 
##                                                                                                            starting 
##                                                                                                                   2 
##                                                                                                                toys 
##                                                                                                                   1 
##                                                                                                          california 
##                                                                                                                   1 
##                                                                                                            designed 
##                                                                                                                   2 
##                                                                                                                fast 
##                                                                                                                   4 
##                                                                                                       httpowlyoonxw 
##                                                                                                                   1 
##                                                                                                         infographic 
##                                                                                                                   2 
##                                                                                                        manufactured 
##                                                                                                                   1 
##                                                                                                                true 
##                                                                                                                   6 
##                                                                                                               liked 
##                                                                                                                   1 
##                                                                                                            original 
##                                                                                                                   2 
##                                                                                                          announcing 
##                                                                                                                   1 
##                                                                                                          confirming 
##                                                                                                                   1 
##                                                                                                       httpowlyor9j3 
##                                                                                                                   1 
##                                                                                                     httpfwtoqo0dqxt 
##                                                                                                                   1 
##                                                                                                             believe 
##                                                                                                                   3 
##                                                                                                             connect 
##                                                                                                                   2 
##                                                                                                                dots 
##                                                                                                                   1 
##                                                                                                             however 
##                                                                                                                   1 
##                                                                                                        mrjamesnoble 
##                                                                                                                   1 
##                                                                                                               signs 
##                                                                                                                   2 
##                                                                                                                 try 
##                                                                                                                   6 
##                                                                                                                 7pm 
##                                                                                                                   1 
##                                                                                                            everyone 
##                                                                                                                   2 
##                                                                                                            creative 
##                                                                                                                   1 
##                                                                                                               imore 
##                                                                                                                   1 
##                                                                                             pictwittercomqbi2za6xuv 
##                                                                                                                   1 
##                                                                                                               64bit 
##                                                                                                                   4 
##                                                                                                            cemented 
##                                                                                                                   1 
##                                                                                                                 no1 
##                                                                                                                   1 
##                                                                                                             picture 
##                                                                                                                   2 
##                                                                                                            position 
##                                                                                                                   2 
##                                                                                                             tablets 
##                                                                                                                   2 
##                                                                                                           yesterday 
##                                                                                                                   2 
##                                                                                                       httpowlyoocpf 
##                                                                                                                   1 
##                                                                                                         phoneblocks 
##                                                                                                                   1 
##                                                                                                           thinglook 
##                                                                                                                   1 
##                                                                                                                2013 
##                                                                                                                   4 
##                                                                                                            forecast 
##                                                                                                                   1 
##                                                                                                                grow 
##                                                                                                                   1 
##                                                                                                                 idc 
##                                                                                                                   1 
##                                                                                                              market 
##                                                                                                                   8 
##                                                                                                              number 
##                                                                                                                   1 
##                                                                                                           worldwide 
##                                                                                                                   2 
##                                                                                                                year 
##                                                                                                                  15 
##                                                                                                            geekchic 
##                                                                                                                   1 
##                                                                                                    httpbitly16lfd2s 
##                                                                                                                   2 
##                                                                                                            motorola 
##                                                                                                                   9 
##                                                                                                         peterloudis 
##                                                                                                                   1 
##                                                                                                          smartphone 
##                                                                                                                   6 
##                                                                                                                game 
##                                                                                                                   4 
##                                                                                                             perfect 
##                                                                                                                   6 
##                                                                                                      pr1nc355haybug 
##                                                                                                                   1 
##                                                                                                              single 
##                                                                                                                   2 
##                                                                                                               steps 
##                                                                                                                   1 
##                                                                                                          teamiphone 
##                                                                                                                   4 
##                                                                                                             cheaper 
##                                                                                                                   3 
##                                                                                                       httphtlyoof4v 
##                                                                                                                   1 
##                                                                                                             succeed 
##                                                                                                                   1 
##                                                                                                               cases 
##                                                                                                                   2 
##                                                                                                           colourful 
##                                                                                                                   2 
##                                                                                                                case 
##                                                                                                                   5 
##                                                                                                               holds 
##                                                                                                                   1 
##                                                                                                              nokias 
##                                                                                                                   2 
##                                                                                                              patent 
##                                                                                                                   2 
##                                                                                                            possibly 
##                                                                                                                   1 
##                                                                                                              surely 
##                                                                                                                   1 
##                                                                                                            surprise 
##                                                                                                                   1 
##                                                                                                            tomorrow 
##                                                                                                                   3 
##                                                                                                             winphan 
##                                                                                                                   1 
##                                                                                                            annoying 
##                                                                                                                   4 
##                                                                                                              coarse 
##                                                                                                                   1 
##                                                                                                               copyp 
##                                                                                                                   1 
##                                                                                                          jon4lakers 
##                                                                                                                   1 
##                                                                                                                ones 
##                                                                                                                   3 
##                                                                                                       technobuffalo 
##                                                                                                                   1 
##                                                                                                           different 
##                                                                                                                   8 
##                                                                                                                 led 
##                                                                                                                   2 
##                                                                                                                 old 
##                                                                                                                  10 
##                                                                                                             problem 
##                                                                                                                   4 
##                                                                                                              solves 
##                                                                                                                   1 
##                                                                                                             adpromo 
##                                                                                                                   1 
##                                                                                                                also 
##                                                                                                                   5 
##                                                                                                            etcanada 
##                                                                                                                   1 
##                                                                                         httpinstagramcompeoodxzgvpq 
##                                                                                                                   1 
##                                                                                                        justinbieber 
##                                                                                                                   1 
##                                                                                                                nice 
##                                                                                                                   4 
##                                                                                                       announcements 
##                                                                                                                   2 
##                                                                                                         clusoclusos 
##                                                                                                                   1 
##                                                                                         httpinstagramcompeka4gsjkil 
##                                                                                                                   1 
##                                                                                                               steve 
##                                                                                                                  12 
##                                                                                                    digitallyperfect 
##                                                                                                                   1 
##                                                                                                              heaven 
##                                                                                                                   1 
##                                                                                                               match 
##                                                                                                                   3 
##                                                                                                               meets 
##                                                                                                                   1 
##                                                                                             pictwittercomg16dmimdt9 
##                                                                                                                   1 
##                                                                                                               trick 
##                                                                                                                   3 
##                                                                                                                aapl 
##                                                                                                                   2 
##                                                                                                           eliminate 
##                                                                                                                   1 
##                                                                                                                grey 
##                                                                                                                   1 
##                                                                                                     httpwpmepeksv7f 
##                                                                                                                   1 
##                                                                                                      inefficiencies 
##                                                                                                                   2 
##                                                                                                               price 
##                                                                                                                  12 
##                                                                                                             setting 
##                                                                                                                   2 
##                                                                                                               twerk 
##                                                                                                                   1 
##                                                                                                       breakthroughs 
##                                                                                                                   1 
##                                                                                                   httpbuffly1dzbmbp 
##                                                                                                                   1 
##                                                                                                          iterations 
##                                                                                                                   1 
##                                                                                                           jmlcolley 
##                                                                                                                   3 
##                                                                                                              spirit 
##                                                                                                                   1 
##                                                                                                              taking 
##                                                                                                                   4 
##                                                                                             pictwittercomyarbr8m7fb 
##                                                                                                                   1 
##                                                                                                       theespinalien 
##                                                                                                                   1 
##                                                                                                                wish 
##                                                                                                                   7 
##                                                                                                               folks 
##                                                                                                                   2 
##                                                                                                                 ibm 
##                                                                                                                   2 
##                                                                                                         programmers 
##                                                                                                                   1 
##                                                                                                             twitter 
##                                                                                                                  22 
##                                                                                                             playing 
##                                                                                                                   2 
##                                                                                                                 qpr 
##                                                                                                                   1 
##                                                                                                                 asi 
##                                                                                                                   4 
##                                                                                                             baratos 
##                                                                                                                   3 
##                                                                                                               bueno 
##                                                                                                                   4 
##                                                                                                                como 
##                                                                                                                   2 
##                                                                                                              cuando 
##                                                                                                                   3 
##                                                                                                                 mas 
##                                                                                                                   4 
##                                                                                             pictwittercomlot9cy2ulv 
##                                                                                                                   1 
##                                                                                                                saca 
##                                                                                                                   2 
##                                                                                                             chillin 
##                                                                                                                   1 
##                                                                                                      highlyhightori 
##                                                                                                                   4 
##                                                                                                              summin 
##                                                                                                                   1 
##                                                                                                          applefreak 
##                                                                                                                   1 
##                                                                                                              demand 
##                                                                                                                   2 
##                                                                                                            applewow 
##                                                                                                                   1 
##                                                                                                       naturallym33h 
##                                                                                                                   1 
##                                                                                                           announced 
##                                                                                                                   3 
##                                                                                                                date 
##                                                                                                                   6 
##                                                                                                            thoughts 
##                                                                                                                   3 
##                                                                                                                 dad 
##                                                                                                                   1 
##                                                                                                                wont 
##                                                                                                                  17 
##                                                                                                          7evenstarz 
##                                                                                                                   7 
##                                                                                                                dude 
##                                                                                                                   3 
##                                                                                                                even 
##                                                                                                                  12 
##                                                                                                              faster 
##                                                                                                                   3 
##                                                                                                              native 
##                                                                                                                   1 
##                                                                                                           processor 
##                                                                                                                   2 
##                                                                                                                 ram 
##                                                                                                                   3 
##                                                                                                            stepping 
##                                                                                                                   1 
##                                                                                                               stone 
##                                                                                                                   2 
##                                                                                                             jonyive 
##                                                                                                                   3 
##                                                                                                               voice 
##                                                                                                                   2 
##                                                                                                        boutthatlife 
##                                                                                                                   1 
##                                                                                                        applepicking 
##                                                                                                                   1 
##                                                                                                             cmb1974 
##                                                                                                                   1 
##                                                                                                               iahhc 
##                                                                                                                   1 
##                                                                                                           mcmillen1 
##                                                                                                                   1 
##                                                                                                                mine 
##                                                                                                                   1 
##                                                                                                         oithelpdesk 
##                                                                                                                   1 
##                                                                                                                pink 
##                                                                                                                   1 
##                                                                                                              sprint 
##                                                                                                                   6 
##                                                                                                            gabriele 
##                                                                                                                   1 
##                                                                                                              grandi 
##                                                                                                                   1 
##                                                                                                         lassistenza 
##                                                                                                                   1 
##                                                                                                           ringrazio 
##                                                                                                                   1 
##                                                                                                                cute 
##                                                                                                                   1 
##                                                                                                      missphilly2013 
##                                                                                                                   1 
##                                                                                                              waited 
##                                                                                                                   2 
##                                                                                                              actual 
##                                                                                                                   1 
##                                                                                                              either 
##                                                                                                                   4 
##                                                                                                            exciting 
##                                                                                                                   1 
##                                                                                                            hardware 
##                                                                                                                   2 
##                                                                                                               model 
##                                                                                                                   1 
##                                                                                                              paving 
##                                                                                                                   1 
##                                                                                                          transition 
##                                                                                                                   1 
##                                                                                                               crazy 
##                                                                                                                   2 
##                                                                                                           ebaycheck 
##                                                                                                                   2 
##                                                                                                           ebayindia 
##                                                                                                                   1 
##                                                                                                               india 
##                                                                                                                   5 
##                                                                                                                 rip 
##                                                                                                                   3 
##                                                                                                               rupee 
##                                                                                                                   1 
##                                                                                                                 use 
##                                                                                                                  18 
##                                                                                                             welcome 
##                                                                                                                   1 
##                                                                                                                favs 
##                                                                                                                   1 
##                                                                                                       httpowlyofqgc 
##                                                                                                                   1 
##                                                                                                              doesnt 
##                                                                                                                  13 
##                                                                                                   httpbuffly1egmopu 
##                                                                                                                   2 
##                                                                                                               likes 
##                                                                                                                   6 
##                                                                                                               malik 
##                                                                                                                   2 
##                                                                                                              hidden 
##                                                                                                                   1 
##                                                                                                   httpfbme1klk3lvn6 
##                                                                                                                   1 
##                                                                                                            ibeacons 
##                                                                                                                   1 
##                                                                                                            advanced 
##                                                                                                                   1 
##                                                                                                            congrats 
##                                                                                                                   1 
##                                                                                                               group 
##                                                                                                                   3 
##                                                                                                              killin 
##                                                                                                                   1 
##                                                                                                                 opt 
##                                                                                                                   1 
##                                                                                                               shiny 
##                                                                                                                   2 
##                                                                                                     technologically 
##                                                                                                                   1 
##                                                                                                               texts 
##                                                                                                                   4 
##                                                                                                              fixing 
##                                                                                                                   1 
##                                                                                                              freeee 
##                                                                                                                   1 
##                                                                                                                gems 
##                                                                                                                   1 
##                                                                                                             keeeruh 
##                                                                                                                   1 
##                                                                                                             luckily 
##                                                                                                                   1 
##                                                                                                             darling 
##                                                                                                                   1 
##                                                                                                        stephenclark 
##                                                                                                                   1 
##                                                                                               httptimehopcom14pf3gc 
##                                                                                                                   1 
##                                                                                                               raven 
##                                                                                                                   1 
##                                                                                                                ipod 
##                                                                                                                  71 
##                                                                                                     ipodplayerpromo 
##                                                                                                                  60 
##                                                                                                               itune 
##                                                                                                                  42 
##                                                                                                promoipodplayerpromo 
##                                                                                                                  42 
##                                                                                                           elliedash 
##                                                                                                                   1 
##                                                                                                     parentoftheyear 
##                                                                                                                   1 
##                                                                                                             compete 
##                                                                                                                   2 
##                                                                                                          constantly 
##                                                                                                                   2 
##                                                                                                              levels 
##                                                                                                                   1 
##                                                                                                        windowsphone 
##                                                                                                                   9 
##                                                                                                                yall 
##                                                                                                                  16 
##                                                                                                            consumer 
##                                                                                                                   3 
##                                                                                                           expensive 
##                                                                                                                   2 
##                                                                                                             feeling 
##                                                                                                                   1 
##                                                                                                              launch 
##                                                                                                                   3 
##                                                                                                               funny 
##                                                                                                                   2 
##                                                                                                                lmao 
##                                                                                                                   6 
##                                                                                                         momentsfade 
##                                                                                                                   1 
##                                                                                                        darrensproat 
##                                                                                                                   2 
##                                                                                                              forget 
##                                                                                                                   2 
##                                                                                                                came 
##                                                                                                                   3 
##                                                                                                               putin 
##                                                                                                                   1 
##                                                                                                            redblack 
##                                                                                                                   1 
##                                                                                                            vladimir 
##                                                                                                                   1 
##                                                                                                            vladsays 
##                                                                                                                   1 
##                                                                                                              wishes 
##                                                                                                                   2 
##                                                                                                               asked 
##                                                                                                                   1 
##                                                                                                              c7five 
##                                                                                                                   1 
##                                                                                                              honest 
##                                                                                                                   2 
##                                                                                                      httpjmp19l1clj 
##                                                                                                                   1 
##                                                                                                           important 
##                                                                                                                   3 
##                                                                                                            question 
##                                                                                                                   1 
##                                                                                                                siri 
##                                                                                                                  12 
##                                                                                                              brings 
##                                                                                                                   2 
##                                                                                                                firm 
##                                                                                                                   2 
##                                                                                                          highlights 
##                                                                                                                   1 
##                                                                                                                 ipo 
##                                                                                                                   3 
##                                                                                                               media 
##                                                                                                                   3 
##                                                                                                               posts 
##                                                                                                                   2 
##                                                                                                              putins 
##                                                                                                                   2 
##                                                                                                             screens 
##                                                                                                                   4 
##                                                                                                              social 
##                                                                                                                   3 
##                                                                                                         socialwally 
##                                                                                                                   2 
##                                                                                                              topics 
##                                                                                                                   1 
##                                                                                                            twitters 
##                                                                                                                   2 
##                                                                                                               enjoy 
##                                                                                                                   1 
##                                                                                                              hahaha 
##                                                                                                                   3 
##                                                                                                         iseeblighty 
##                                                                                                                   1 
##                                                                                             pictwittercomym1a0z6rzj 
##                                                                                                                   1 
##                                                                                                               twits 
##                                                                                                                   1 
##                                                                                                              backed 
##                                                                                                                   2 
##                                                                                                 fingerprintscanning 
##                                                                                                                   1 
##                                                                                                           listening 
##                                                                                                                   1 
##                                                                                                            metallic 
##                                                                                                                   1 
##                                                                                                              pastic 
##                                                                                                                   1 
##                                                                                                         touchscreen 
##                                                                                                                   1 
##                                                                                                                22nd 
##                                                                                                                   1 
##                                                                                                                 350 
##                                                                                                                   1 
##                                                                                                               brian 
##                                                                                                                   1 
##                                                                                                               danny 
##                                                                                                                   1 
##                                                                                                             gazelle 
##                                                                                                                   1 
##                                                                                                           jonjonnyp 
##                                                                                                                   2 
##                                                                                                               offer 
##                                                                                                                   4 
##                                                                                                            employee 
##                                                                                                                   2 
##                                                                                                              firing 
##                                                                                                                   1 
##                                                                                                                shot 
##                                                                                                                   2 
##                                                                                                               stock 
##                                                                                                                   6 
##                                                                                                               worry 
##                                                                                                                   2 
##                                                                                                           available 
##                                                                                                                  10 
##                                                                                                       creativefutur 
##                                                                                                                   3 
##                                                                                             pictwittercombgfbbqiu0v 
##                                                                                                                   1 
##                                                                                                                play 
##                                                                                                                   4 
##                                                                                                         uwscreative 
##                                                                                                                   3 
##                                                                                                          authorized 
##                                                                                                                   1 
##                                                                                                                 guy 
##                                                                                                                   5 
##                                                                                                               ipads 
##                                                                                                                   3 
##                                                                                                              repair 
##                                                                                                                   2 
##                                                                                                               since 
##                                                                                                                   8 
##                                                                                                           someplace 
##                                                                                                                   1 
##                                                                                                     accordingtonina 
##                                                                                                                   1 
##                                                                                                            akemisue 
##                                                                                                                   1 
##                                                                                                                hope 
##                                                                                                                   6 
##                                                                                                              needed 
##                                                                                                                   3 
##                                                                                                          shastaanne 
##                                                                                                                   1 
##                                                                                                          government 
##                                                                                                                   3 
##                                                                                                      infrastructure 
##                                                                                                                   3 
##                                                                                                             mishiza 
##                                                                                                                   8 
##                                                                                                            natz0711 
##                                                                                                                   7 
##                                                                                                           regulated 
##                                                                                                                   1 
##                                                                                                           samsungsa 
##                                                                                                                   8 
##                                                                                                    brokenhomebutton 
##                                                                                                                   1 
##                                                                                                              dammit 
##                                                                                                                   1 
##                                                                                                               money 
##                                                                                                                   8 
##                                                                                                               dying 
##                                                                                                                   3 
##                                                                                                             hurryup 
##                                                                                                                   1 
##                                                                                                                 ugh 
##                                                                                                                   4 
##                                                                                                          johnathonv 
##                                                                                                                   1 
##                                                                                                            learning 
##                                                                                                                   1 
##                                                                                                           announces 
##                                                                                                                   4 
##                                                                                                       httpowlyomrmn 
##                                                                                                                   1 
##                                                                                                              rivals 
##                                                                                                                   1 
##                                                                                                                turn 
##                                                                                                                   6 
##                                                                                                             digital 
##                                                                                                                   1 
##                                                                                                                 fun 
##                                                                                                                   8 
##                                                                                                 httponmashto1bq5lp3 
##                                                                                                                   1 
##                                                                                                          massmarket 
##                                                                                                                   1 
##                                                                                                           takentooz 
##                                                                                                                   1 
##                                                                                                               fully 
##                                                                                                                   1 
##                                                                                                             gadgets 
##                                                                                                                   1 
##                                                                                                                hear 
##                                                                                                                   2 
##                                                                                                         jenniebond1 
##                                                                                                                   1 
##                                                                                                             greater 
##                                                                                                                   1 
##                                                                                                               ratio 
##                                                                                                                   1 
##                                                                                                            startups 
##                                                                                                                   1 
##                                                                                                           valuation 
##                                                                                                                   1 
##                                                                                                               laugh 
##                                                                                                                   3 
##                                                                                                            peasants 
##                                                                                                                   1 
##                                                                                                              chance 
##                                                                                                                   2 
##                                                                                                             develop 
##                                                                                                                   1 
##                                                                                                          developers 
##                                                                                                                   1 
##                                                                                                                diss 
##                                                                                                                   1 
##                                                                                                                dumb 
##                                                                                                                   1 
##                                                                                                                orig 
##                                                                                                                   1 
##                                                                                                           eltonjohn 
##                                                                                                                   1 
##                                                                                                              unreal 
##                                                                                                                   1 
##                                                                                                               watch 
##                                                                                                                   5 
##                                                                                                      httpowlyi38y2b 
##                                                                                                                   1 
##                                                                                                              darnit 
##                                                                                                                   2 
##                                                                                                              don1za 
##                                                                                                                   4 
##                                                                                                                 lol 
##                                                                                                                  21 
##                                                                                                            brothers 
##                                                                                                                   1 
##                                                                                                                 ctl 
##                                                                                                                   1 
##                                                                                                                fans 
##                                                                                                                   2 
##                                                                                                       httpowlyopeax 
##                                                                                                                   1 
##                                                                                                                koch 
##                                                                                                                   1 
##                                                                                                             libcrib 
##                                                                                                                   1 
##                                                                                                                 ows 
##                                                                                                                   1 
##                                                                                                             prepare 
##                                                                                                                   1 
##                                                                                                         progressive 
##                                                                                                                   1 
##                                                                                                           uniteblue 
##                                                                                                                   1 
##                                                                                                             bubbles 
##                                                                                                                   1 
##                                                                                                              device 
##                                                                                                                   2 
##                                                                                                            imessage 
##                                                                                                                   6 
##                                                                                                              motion 
##                                                                                                                   1 
##                                                                                                                 red 
##                                                                                                                   3 
##                                                                                                              sender 
##                                                                                                                   1 
##                                                                                                                text 
##                                                                                                                   6 
##                                                                                                        shopbreamall 
##                                                                                                                   1 
##                                                                                                                feel 
##                                                                                                                   6 
##                                                                                                               mikey 
##                                                                                                                   1 
##                                                                                                              really 
##                                                                                                                  29 
##                                                                                                                tell 
##                                                                                                                   7 
##                                                                                                        boomheadshot 
##                                                                                                                   1 
##                                                                                                               gotta 
##                                                                                                                   1 
##                                                                                                               ipods 
##                                                                                                                   2 
##                                                                                                                 man 
##                                                                                                                   7 
##                                                                                                                 nfc 
##                                                                                                                   6 
##                                                                                                                song 
##                                                                                                                   4 
##                                                                                                                taps 
##                                                                                                                   1 
##                                                                                                                 woe 
##                                                                                                                   1 
##                                                                                                          appleevent 
##                                                                                                                   1 
##                                                                                                           applenews 
##                                                                                                                   2 
##                                                                                                              create 
##                                                                                                                   4 
##                                                                                                            ishoes5s 
##                                                                                                                   1 
##                                                                                                          everything 
##                                                                                                                   6 
##                                                                                                    httpbitly14mbzlm 
##                                                                                                                   2 
##                                                                                                       sharpmagazine 
##                                                                                                                   1 
##                                                                                                          interested 
##                                                                                                                   1 
##                                                                                                          isfarahmad 
##                                                                                                                   1 
##                                                                                                               lumia 
##                                                                                                                   2 
##                                                                                                           potasiyam 
##                                                                                                                   1 
##                                                                                                         thehoneymad 
##                                                                                                                   1 
##                                                                                                              glossy 
##                                                                                                                   1 
##                                                                                                          macbookpro 
##                                                                                                                   1 
##                                                                                                               matte 
##                                                                                                                   1 
##                                                                                                              option 
##                                                                                                                   4 
##                                                                                                          apparently 
##                                                                                                                   4 
##                                                                                                        ghosttgaming 
##                                                                                                                   3 
##                                                                                                               lives 
##                                                                                                                   1 
##                                                                                                              london 
##                                                                                                                   1 
##                                                                                                          tehgreenmc 
##                                                                                                                   2 
##                                                                                                              battle 
##                                                                                                                   2 
##                                                                                                                epic 
##                                                                                                                   1 
##                                                                                                     geekhelpinghand 
##                                                                                                                   1 
##                                                                                                   httpbuffly187kjcd 
##                                                                                                                   1 
##                                                                                                           applecare 
##                                                                                                                   2 
##                                                                                                          assistance 
##                                                                                                                   1 
##                                                                                                                dept 
##                                                                                                                   2 
##                                                                                                             florida 
##                                                                                                                   1 
##                                                                                                              police 
##                                                                                                                   1 
##                                                                                                           zimmerman 
##                                                                                                                   1 
##                                                                                                            announce 
##                                                                                                                   3 
##                                                                                                           impatient 
##                                                                                                                   1 
##                                                                                                           wantapple 
##                                                                                                                   1 
##                                                                                                            boydscot 
##                                                                                                                   1 
##                                                                                                                chat 
##                                                                                                                   1 
##                                                                                                            delivery 
##                                                                                                                   1 
##                                                                                                             kthanks 
##                                                                                                                   1 
##                                                                                                                rush 
##                                                                                                                   1 
##                                                                                                                snap 
##                                                                                                                   1 
##                                                                                                              aiming 
##                                                                                                                   2 
##                                                                                                             classic 
##                                                                                                                   2 
##                                                                                                                 end 
##                                                                                                                   3 
##                                                                                                    httpdisqus8f4kw3 
##                                                                                                                   1 
##                                                                                                               wayne 
##                                                                                                                   1 
##                                                                                                         wayneshurts 
##                                                                                                                   1 
##                                                                                                               crisp 
##                                                                                                                   1 
##                                                                                                               hasnt 
##                                                                                                                   5 
##                                                                                                                 pie 
##                                                                                                                   1 
##                                                                                                            piephone 
##                                                                                                                   1 
##                                                                                                                 ask 
##                                                                                                                   1 
##                                                                                                            coverage 
##                                                                                                                   1 
##                                                                                                            wherever 
##                                                                                                                   1 
##                                                                                                             whoever 
##                                                                                                                   1 
##                                                                                                            adambain 
##                                                                                                                   5 
##                                                                                                             correct 
##                                                                                                                   2 
##                                                                                                                term 
##                                                                                                                   2 
##                                                                                                         thepartycow 
##                                                                                                                   4 
##                                                                                                        winthemoment 
##                                                                                                                   1 
##                                                                                                      brenberryblast 
##                                                                                                                   1 
##                                                                                                            echrofon 
##                                                                                                                   1 
##                                                                                                            feedback 
##                                                                                                                   2 
##                                                                                                                gcyc 
##                                                                                                                   1 
##                                                                                                                half 
##                                                                                                                   4 
##                                                                                                               reply 
##                                                                                                                   1 
##                                                                                                            whatsapp 
##                                                                                                                   1 
##                                                                                                               cisco 
##                                                                                                                   1 
##                                                                                                           donations 
##                                                                                                                   1 
##                                                                                                       httpowlyobk5i 
##                                                                                                                   1 
##                                                                                                              oracle 
##                                                                                                                   1 
##                                                                                                          salesforce 
##                                                                                                                   1 
##                                                                                                               promo 
##                                                                                                                  20 
##                                                                                                              asking 
##                                                                                                                   3 
##                                                                                                          waterproof 
##                                                                                                                   5 
##                                                                                                             ironman 
##                                                                                                                   1 
##                                                                                                                male 
##                                                                                                                   1 
##                                                                                                           sincerely 
##                                                                                                                   2 
##                                                                                                               brown 
##                                                                                                                   1 
##                                                                                                           emoticons 
##                                                                                                                   1 
##                                                                                                                face 
##                                                                                                                   4 
##                                                                                                                harm 
##                                                                                                                   1 
##                                                                                                                mean 
##                                                                                                                   3 
##                                                                                                                 pls 
##                                                                                                                   3 
##                                                                                                                 ppl 
##                                                                                                                   8 
##                                                                                                                 thx 
##                                                                                                                   3 
##                                                                                                     timcookappleceo 
##                                                                                                                   1 
##                                                                                                                axis 
##                                                                                                                   1 
##                                                                                                        conservative 
##                                                                                                                   1 
##                                                                                                        constructive 
##                                                                                                                   1 
##                                                                                                         destructive 
##                                                                                                                   1 
##                                                                                                             liberal 
##                                                                                                                   1 
##                                                                                                                qotd 
##                                                                                                                   1 
##                                                                                                               quote 
##                                                                                                                   1 
##                                                                                                           stevejobs 
##                                                                                                                   3 
##                                                                                                       wordsofwisdom 
##                                                                                                                   1 
##                                                                                                                20th 
##                                                                                                                   4 
##                                                                                                    httpbitly1ahyzmo 
##                                                                                                                   1 
##                                                                                                           september 
##                                                                                                                   2 
##                                                                                                             colours 
##                                                                                                                   3 
##                                                                                                                mini 
##                                                                                                                   4 
##                                                                                                              pastel 
##                                                                                                                   1 
##                                                                                                           pschiller 
##                                                                                                                   2 
##                                                                                                           surprised 
##                                                                                                                   1 
##                                                                                                             version 
##                                                                                                                   4 
##                                                                                                           sixtyfour 
##                                                                                                                   1 
##                                                                                                             slammed 
##                                                                                                                   1 
##                                                                                                           thirtytwo 
##                                                                                                                   1 
##                                                                                                                 bic 
##                                                                                                                   1 
##                                                                                                         compartment 
##                                                                                                                   1 
##                                                                                                               fluid 
##                                                                                                                   1 
##                                                                                                             lighter 
##                                                                                                                   1 
##                                                                                                          refillable 
##                                                                                                                   1 
##                                                                                                              zippos 
##                                                                                                                   1 
##                                                                                                               built 
##                                                                                                                   1 
##                                                                                                            cnnmoney 
##                                                                                                                   1 
##                                                                                                            covering 
##                                                                                                                   1 
##                                                                                                                hall 
##                                                                                                                   1 
##                                                                                                      httppb2co8ppx5 
##                                                                                                                   1 
##                                                                                                                iso7 
##                                                                                                                   1 
##                                                                                                                jobs 
##                                                                                                                   7 
##                                                                                                                town 
##                                                                                                                   1 
##                                                                                                     tomlinshortcake 
##                                                                                                                   1 
##                                                                                                            bezoekje 
##                                                                                                                   1 
##                                                                                                    nieuwsgierigheid 
##                                                                                                                   1 
##                                                                                                                 nyc 
##                                                                                                                   1 
##                                                                                                                onze 
##                                                                                                                   1 
##                                                                                                             plezier 
##                                                                                                                   1 
##                                                                                                         somemonteur 
##                                                                                                                   1 
##                                                                                                                veel 
##                                                                                                                   2 
##                                                                                                              wensen 
##                                                                                                                   1 
##                                                                                                                 wij 
##                                                                                                                   1 
##                                                                                                              level6 
##                                                                                                                   1 
##                                                                                                        ginianightly 
##                                                                                                                   2 
##                                                                                                                left 
##                                                                                                                   4 
##                                                                                                                page 
##                                                                                                                   3 
##                                                                                                                 put 
##                                                                                                                   6 
##                                                                                                              safari 
##                                                                                                                   4 
##                                                                                                        highsnobiety 
##                                                                                                                   2 
##                                                                                                    httpbitly1earplz 
##                                                                                                                   2 
##                                                                                    pictwittercompoegs09trbalifbladz 
##                                                                                                                   1 
##                                                                                                          preordered 
##                                                                                                                   2 
##                                                                                             pictwittercomxs8q9yklaz 
##                                                                                                                   1 
##                                                                                                             clinton 
##                                                                                                                   1 
##                                                                                                               creek 
##                                                                                                                   1 
##                                                                                                   http4sqcom17ylume 
##                                                                                                                   1 
##                                                                                                           partridge 
##                                                                                                                   1 
##                                                                                                            township 
##                                                                                                                   1 
##                                                                                                          alcagimizi 
##                                                                                                                   1 
##                                                                                                           hangisini 
##                                                                                                                   1 
##                                                                                                               kanka 
##                                                                                                                   1 
##                                                                                                            sasirdik 
##                                                                                                                   1 
##                                                                                                          darthdream 
##                                                                                                                   1 
##                                                                                                         oyincansoda 
##                                                                                                                   1 
##                                                                                                                team 
##                                                                                                                   4 
##                                                                                                             clothes 
##                                                                                                                   1 
##                                                                                                             happier 
##                                                                                                                   1 
##                                                                                                               might 
##                                                                                                                   3 
##                                                                                                                 yer 
##                                                                                                                   1 
##                                                                                             pictwittercomdpc2fg8jdv 
##                                                                                                                   1 
##                                                                                                             warning 
##                                                                                                                   2 
##                                                                                                              called 
##                                                                                                                   6 
##                                                                                                                copy 
##                                                                                                                   4 
##                                                                                                            fluzzity 
##                                                                                                                   1 
##                                                                                                           ifluzzthe 
##                                                                                                                   1 
##                                                                                                              making 
##                                                                                                                  16 
##                                                                                             pictwittercom00ddso3i0o 
##                                                                                                                   1 
##                                                                                                                 ayo 
##                                                                                                                   1 
##                                                                                                           everyones 
##                                                                                                                   2 
##                                                                                                                fact 
##                                                                                                                   3 
##                                                                                                        fingerprints 
##                                                                                                                   6 
##                                                                                                              tongue 
##                                                                                                                   1 
##                                                                                                             airplay 
##                                                                                                                   1 
##                                                                                                        makeithappen 
##                                                                                                                   1 
##                                                                                                           mavericks 
##                                                                                                                   1 
##                                                                                                                 abt 
##                                                                                                                   2 
##                                                                                                           customers 
##                                                                                                                   2 
##                                                                                                                edge 
##                                                                                                                   1 
##                                                                                                             leading 
##                                                                                                                   1 
##                                                                                                               opcos 
##                                                                                                                   1 
##                                                                                             pictwittercomovtw9d1vaj 
##                                                                                                                   1 
##                                                                                                               sysco 
##                                                                                                                   2 
##                                                                                                               visit 
##                                                                                                                   1 
##                                                                                                              wassup 
##                                                                                                                   2 
##                                                                                                           blocklike 
##                                                                                                                   1 
##                                                                                                               hurry 
##                                                                                                                   2 
##                                                                                                      realexpayments 
##                                                                                                                   1 
##                                                                                                     talkingpayments 
##                                                                                                                   1 
##                                                                                                         cecilialuis 
##                                                                                                                   1 
##                                                                                                         hipstamatic 
##                                                                                                                   1 
##                                                                                                      lifeinlofiblog 
##                                                                                                                   1 
##                                                                                                                oggl 
##                                                                                                                   1 
##                                                                                                                18th 
##                                                                                                                   2 
##                                                                                                       the1ndonly365 
##                                                                                                                   2 
##                                                                                                             nava520 
##                                                                                                                   1 
##                                                                                                         engineering 
##                                                                                                                   1 
##                                                                                                 httponwsjcom186mzi1 
##                                                                                                                   1 
##                                                                                                              ohwell 
##                                                                                                                   1 
##                                                                                                               place 
##                                                                                                                   1 
##                                                                                                             seattle 
##                                                                                                                   1 
##                                                                                                               start 
##                                                                                                                   2 
##                                                                                                                 wsj 
##                                                                                                                   1 
##                                                                                                             catscab 
##                                                                                                                   2 
##                                                                                                            download 
##                                                                                                                   3 
##                                                                                                            students 
##                                                                                                                   2 
##                                                                                                               uksga 
##                                                                                                                   2 
##                                                                                                      universityofky 
##                                                                                                                   2 
##                                                                                                                 biz 
##                                                                                                                   2 
##                                                                                                           departure 
##                                                                                                                   1 
##                                                                                                              expand 
##                                                                                                                   1 
##                                                                                                       httpowlyomtd3 
##                                                                                                                   1 
##                                                                                                             lowcost 
##                                                                                                                   1 
##                                                                                                             simpler 
##                                                                                                                   1 
##                                                                                                                dije 
##                                                                                                                   1 
##                                                                                                                 era 
##                                                                                                                   2 
##                                                                                                          frmoisesfr 
##                                                                                                                   1 
##                                                                                                                 los 
##                                                                                                                   7 
##                                                                                                                 muy 
##                                                                                                                   1 
##                                                                                                              nuevos 
##                                                                                                                   5 
##                                                                                                                 que 
##                                                                                                                  12 
##                                                                                                                 ser 
##                                                                                                                   2 
##                                                                                                                 van 
##                                                                                                                   2 
##                                                                                                             grabbed 
##                                                                                                                   1 
##                                                                                                            millions 
##                                                                                                                   1 
##                                                                                                                must 
##                                                                                                                   2 
##                                                                                                              person 
##                                                                                                                   4 
##                                                                                                        dereksanders 
##                                                                                                                   2 
##                                                                                                        frickfuentes 
##                                                                                                                   1 
##                                                                                                               65min 
##                                                                                                                   1 
##                                                                                                          expression 
##                                                                                                                   1 
##                                                                                                              facial 
##                                                                                                                   1 
##                                                                                                        lanceulanoff 
##                                                                                                                   1 
##                                                                                                             special 
##                                                                                                                   2 
##                                                                                                                wile 
##                                                                                                                   1 
##                                                                                                                 io7 
##                                                                                                                   1 
##                                                                                                               piece 
##                                                                                                                   4 
##                                                                                                            provided 
##                                                                                                                   1 
##                                                                                                                 def 
##                                                                                                                   1 
##                                                                                                                kind 
##                                                                                                                   2 
##                                                                                                              sept20 
##                                                                                                                   1 
##                                                                                                             fishbat 
##                                                                                                                   2 
##                                                                                                    httpbitly17wfujr 
##                                                                                                                   2 
##                                                                                                       revolutionize 
##                                                                                                                   2 
##                                                                                                         collaborate 
##                                                                                                                   1 
##                                                                                                                 lfw 
##                                                                                                                   3 
##                                                                                                             mcstyle 
##                                                                                                                   1 
##                                                                                             pictwittercomueyrkwl6i6 
##                                                                                                                   1 
##                                                                                                               share 
##                                                                                                                   4 
##                                                                                             pictwittercomymgc0ugkoa 
##                                                                                                                   1 
##                                                                                                             adornar 
##                                                                                                                   1 
##                                                                                                              claves 
##                                                                                                                   2 
##                                                                                                           coloridas 
##                                                                                                                   1 
##                                                                                                              fundas 
##                                                                                                                   1 
##                                                                                                                gifs 
##                                                                                                                   3 
##                                                                                                    httpbitly1e6hrok 
##                                                                                                                   1 
##                                                                                                             nuestro 
##                                                                                                                   1 
##                                                                                                              nuevas 
##                                                                                                                   1 
##                                                                                                                para 
##                                                                                                                   6 
##                                                                                                            proteger 
##                                                                                                                   1 
##                                                                                                             resumen 
##                                                                                                                   2 
##                                                                                                       csotournament 
##                                                                                                                   1 
##                                                                                                              dreamz 
##                                                                                                                   1 
##                                                                                                               segar 
##                                                                                                                   1 
##                                                                                                               taman 
##                                                                                                                   1 
##                                                                                                                 bar 
##                                                                                                                   2 
##                                                                                                        notification 
##                                                                                                                   2 
##                                                                                                            tweeting 
##                                                                                                                   1 
##                                                                                                             driving 
##                                                                                                                   2 
##                                                                                                                knew 
##                                                                                                                   2 
##                                                                                                            prodmktg 
##                                                                                                                   1 
##                                                                                                             provide 
##                                                                                                                   2 
##                                                                                                             someone 
##                                                                                                                   5 
##                                                                                                               heeey 
##                                                                                                                   1 
##                                                                                                                heey 
##                                                                                                                   1 
##                                                                                             pictwittercom50fidqhmrd 
##                                                                                                                   1 
##                                                                                                         autocorrect 
##                                                                                                                   2 
##                                                                                                                onto 
##                                                                                                                   1 
##                                                                                                           vaginitis 
##                                                                                                                   1 
##                                                                                                               aller 
##                                                                                                                   1 
##                                                                                                               multi 
##                                                                                                                   1 
##                                                                                                                vive 
##                                                                                                                   1 
##                                                                                                          chunherena 
##                                                                                                                   1 
##                                                                                                           followers 
##                                                                                                                   3 
##                                                                                                                note 
##                                                                                                                   1 
##                                                                                                             sarcasm 
##                                                                                                                   1 
##                                                                                                               small 
##                                                                                                                   1 
##                                                                                                                2014 
##                                                                                                                   3 
##                                                                                                        collaborates 
##                                                                                                                   2 
##                                                                                                       httpowlyopzc5 
##                                                                                                                   2 
##                                                                                                           newsflash 
##                                                                                                                   2 
##                                                                                                        springsummer 
##                                                                                                                   3 
##                                                                                                                long 
##                                                                                                                   4 
##                                                                                                             receive 
##                                                                                                                   2 
##                                                                                                           quiilucru 
##                                                                                                                   1 
##                                                                                                          huhuhuhuhu 
##                                                                                                                   1 
##                                                                                                               oonga 
##                                                                                                                   1 
##                                                                                                               paasa 
##                                                                                                                   1 
##                                                                                                          sheisyanni 
##                                                                                                                   1 
##                                                                                                                dans 
##                                                                                                                   1 
##                                                                                                               doigt 
##                                                                                                                   1 
##                                                                                                          inviolable 
##                                                                                                                   1 
##                                                                                                               loeil 
##                                                                                                                   1 
##                                                                                                                 met 
##                                                                                                                   4 
##                                                                                                                 3rd 
##                                                                                                                   1 
##                                                                                                               broke 
##                                                                                                                   3 
##                                                                                                                pair 
##                                                                                                                   1 
##                                                                                                             descola 
##                                                                                                                   1 
##                                                                                                                logo 
##                                                                                                                   1 
##                                                                                                               porra 
##                                                                                                                   1 
##                                                                                                         downloading 
##                                                                                                                   1 
##                                                                                                             details 
##                                                                                                                   2 
##                                                                                                   httpfbme2tg09dhvb 
##                                                                                                                   1 
##                                                                                                          manolomata 
##                                                                                                                   1 
##                                                                                                                peor 
##                                                                                                                   1 
##                                                                                                              bigger 
##                                                                                                                   2 
##                                                                                                                 ble 
##                                                                                                                   1 
##                                                                                                             burgesg 
##                                                                                                                   1 
##                                                                                                                deal 
##                                                                                                                   5 
##                                                                                                              george 
##                                                                                                                   1 
##                                                                                                           immersive 
##                                                                                                                   1 
##                                                                                                             mulderc 
##                                                                                                                   1 
##                                                                                                              wonder 
##                                                                                                                   4 
##                                                                                                             toddcox 
##                                                                                                                   1 
##                                                                                                     ayudamovistarve 
##                                                                                                                   5 
##                                                                                                              bought 
##                                                                                                                   1 
##                                                                                                         environment 
##                                                                                                                   1 
##                                                                                                              forbes 
##                                                                                                                   2 
##                                                                                                             oranges 
##                                                                                                                   1 
##                                                                                                           preedward 
##                                                                                                                   1 
##                                                                                                             snowden 
##                                                                                                                   2 
##                                                                                                               whack 
##                                                                                                                   2 
##                                                                                                              appled 
##                                                                                                                   1 
##                                                                                                               bucks 
##                                                                                                                   2 
##                                                                                                             million 
##                                                                                                                   2 
##                                                                                                                piss 
##                                                                                                                   2 
##                                                                                                                0909 
##                                                                                                                   1 
##                                                                                                                0910 
##                                                                                                                   1 
##                                                                                                                320k 
##                                                                                                                   1 
##                                                                                                                 86m 
##                                                                                                                   1 
##                                                                                                                ball 
##                                                                                                                   1 
##                                                                                                               count 
##                                                                                                                   2 
##                                                                                                          mileycyrus 
##                                                                                                                   1 
##                                                                                                        mindblowngif 
##                                                                                                                   1 
##                                                                                                              source 
##                                                                                                                   1 
##                                                                                                                view 
##                                                                                                                   3 
##                                                                                                            wrecking 
##                                                                                                                   1 
##                                                                                                             youtube 
##                                                                                                                   3 
##                                                                                                             account 
##                                                                                                                   4 
##                                                                                                       condescension 
##                                                                                                                   7 
##                                                                                                       httphtlyoptog 
##                                                                                                                   1 
##                                                                                                         photography 
##                                                                                                                   7 
##                                                                                                             photogs 
##                                                                                                                   7 
##                                                                                                               quiet 
##                                                                                                                   7 
##                                                                                                              coupon 
##                                                                                                                   1 
##                                                                                                             daycare 
##                                                                                                                   1 
##                                                                                             pictwittercomcm4xccfeqh 
##                                                                                                                   1 
##                                                                                                             savings 
##                                                                                                                   1 
##                                                                                                                 5sc 
##                                                                                                                   2 
##                                                                                                             confuse 
##                                                                                                                   1 
##                                                                                                                 imo 
##                                                                                                                   2 
##                                                                                                               meant 
##                                                                                                                   2 
##                                                                                                             russian 
##                                                                                                                   1 
##                                                                                                                 884 
##                                                                                                                   1 
##                                                                                                              baixar 
##                                                                                                                   1 
##                                                                                                             consigo 
##                                                                                                                   1 
##                                                                                                               digam 
##                                                                                                                   1 
##                                                                                                                jogo 
##                                                                                                                   1 
##                                                                                                              livres 
##                                                                                                                   1 
##                                                                                                                size 
##                                                                                                                   2 
##                                                                                                               tenho 
##                                                                                                                   1 
##                                                                                                                21st 
##                                                                                                                   1 
##                                                                                                            centurys 
##                                                                                                                   1 
##                                                                                                        expectations 
##                                                                                                                   1 
##                                                                                                              irobot 
##                                                                                                                   1 
##                                                                                                              robots 
##                                                                                                                   1 
##                                                                                                              wheres 
##                                                                                                                   3 
##                                                                                                                 ari 
##                                                                                                                   1 
##                                                                                                             beidzot 
##                                                                                                                   1 
##                                                                                                                 bus 
##                                                                                                                   1 
##                                                                                                                isti 
##                                                                                                                   1 
##                                                                                                            jaizlasa 
##                                                                                                                   1 
##                                                                                                                 jki 
##                                                                                                                   1 
##                                                                                                              laikam 
##                                                                                                                   1 
##                                                                                                         pasludinaja 
##                                                                                                                   1 
##                                                                                                          ticigajiem 
##                                                                                                                   1 
##                                                                                                               backs 
##                                                                                                                   1 
##                                                                                                   httpbuffly19ksdcr 
##                                                                                                                   1 
##                                                                                                              switch 
##                                                                                                                   5 
##                                                                                                            companys 
##                                                                                                                   1 
##                                                                                                            dougkass 
##                                                                                                                   1 
##                                                                                                             experts 
##                                                                                                                   1 
##                                                                                                                fail 
##                                                                                                                   5 
##                                                                                                         marketshare 
##                                                                                                                   1 
##                                                                                                             profits 
##                                                                                                                   2 
##                                                                                                              proves 
##                                                                                                                   1 
##                                                                                                             realize 
##                                                                                                                   2 
##                                                                                                               value 
##                                                                                                                   1 
##                                                                                                            dislikes 
##                                                                                                                   1 
##                                                                                                   httpbuffly1emp3xh 
##                                                                                                                   1 
##                                                                                                       shutuparielle 
##                                                                                                                   1 
##                                                                                                                 cut 
##                                                                                                                   4 
##                                                                                                               final 
##                                                                                                                   2 
##                                                                                                              french 
##                                                                                                                   2 
##                                                                                                    httpbitly1eokgf5 
##                                                                                                                   1 
##                                                                                                                mans 
##                                                                                                                   2 
##                                                                                                      postproduction 
##                                                                                                                   1 
##                                                                                                              second 
##                                                                                                                   4 
##                                                                                                               turns 
##                                                                                                                   4 
##                                                                                                                 boa 
##                                                                                                                   1 
##                                                                                                                eras 
##                                                                                                                   1 
##                                                                                                               nossa 
##                                                                                                                   1 
##                                                                                                               porem 
##                                                                                                                   1 
##                                                                                                              sempre 
##                                                                                                                   1 
##                                                                                                                 tao 
##                                                                                                                   1 
##                                                                                                               trava 
##                                                                                                                   1 
##                                                                                                         electrafood 
##                                                                                                                   4 
##                                                                                                                 hah 
##                                                                                                                   1 
##                                                                                                           literally 
##                                                                                                                   4 
##                                                                                                             thought 
##                                                                                                                   5 
##                                                                                                               cheap 
##                                                                                                                  14 
##                                                                                                             cheapen 
##                                                                                                                   1 
##                                                                                                          difference 
##                                                                                                                   3 
##                                                                                                            renaming 
##                                                                                                                   1 
##                                                                                                               stand 
##                                                                                                                   5 
##                                                                                                                 car 
##                                                                                                                   1 
##                                                                                                     customerexplabs 
##                                                                                                                   1 
##                                                                                                              figure 
##                                                                                                                   5 
##                                                                                                     httpgoogl6jqkcv 
##                                                                                                                   1 
##                                                                                                              parked 
##                                                                                                                   1 
##                                                                                                             testing 
##                                                                                                                   1 
##                                                                                                          biometrics 
##                                                                                                                   3 
##                                                                                                               fires 
##                                                                                                                   1 
##                                                                                                   httpreutrs15tharz 
##                                                                                                                   1 
##                                                                                                             insight 
##                                                                                                                   1 
##                                                                                                          mainstream 
##                                                                                                                   1 
##                                                                                                             trigger 
##                                                                                                                   1 
##                                                                                              httpyoutube1siwez9haba 
##                                                                                                                   1 
##                                                                                                              parody 
##                                                                                                                   1 
##                                                                                                         sagarkamesh 
##                                                                                                                   3 
##                                                                                                                appl 
##                                                                                                                   1 
##                                                                                                              crypto 
##                                                                                                                   1 
##                                                                                                             effects 
##                                                                                                                   1 
##                                                                                                   httplnisbitly3hja 
##                                                                                                                   1 
##                                                                                                               legal 
##                                                                                                                   1 
##                                                                                                       marciahofmann 
##                                                                                                                   1 
##                                                                                                             privacy 
##                                                                                                                   2 
##                                                                                                           cleveland 
##                                                                                                                   1 
##                                                                                                             closest 
##                                                                                                                   1 
##                                                                                                     httpbitlya83mmb 
##                                                                                                                   2 
##                                                                                                        postproducti 
##                                                                                                                   1 
##                                                                                                             bateria 
##                                                                                                                   1 
##                                                                                                                dure 
##                                                                                                                   1 
##                                                                                                               pedir 
##                                                                                                                   1 
##                                                                                                                pido 
##                                                                                                                   1 
##                                                                                                                solo 
##                                                                                                                   1 
##                                                                                                           taaaaanto 
##                                                                                                                   1 
##                                                                                                                 una 
##                                                                                                                   2 
##                                                                                                            coisinha 
##                                                                                                                   1 
##                                                                                                               gatos 
##                                                                                                                   1 
##                                                                                                            inventem 
##                                                                                                                   1 
##                                                                                                              melhor 
##                                                                                                                   1 
##                                                                                                               parem 
##                                                                                                                   1 
##                                                                                                                 uma 
##                                                                                                                   1 
##                                                                                                         backchannel 
##                                                                                                                   1 
##                                                                                                               birth 
##                                                                                                                   1 
##                                                                                                               child 
##                                                                                                                   1 
##                                                                                                          commercial 
##                                                                                                                   2 
##                                                                                                            facetime 
##                                                                                                                   1 
##                                                                                                               japan 
##                                                                                                                   2 
##                                                                                                             soldier 
##                                                                                                                   1 
##                                                                                                            diabetic 
##                                                                                                                   1 
##                                                                                                                 doc 
##                                                                                                                   1 
##                                                                                                                dsma 
##                                                                                                                   1 
##                                                                                                           impressed 
##                                                                                                                   2 
##                                                                                                          recognizes 
##                                                                                                                   1 
##                                                                                                               type1 
##                                                                                                                   1 
##                                                                                                               burst 
##                                                                                                                   1 
##                                                                                                         dougrtequan 
##                                                                                                                   3 
##                                                                                                               loset 
##                                                                                                                   1 
##                                                                                                               prior 
##                                                                                                                   2 
##                                                                                                           subotaged 
##                                                                                                                   1 
##                                                                                                              winner 
##                                                                                                                   1 
##                                                                                                              brands 
##                                                                                                                   1 
##                                                                                               httpbitlyapplesecrets 
##                                                                                                                   1 
##                                                                                                            releases 
##                                                                                                                   3 
##                                                                                                             remains 
##                                                                                                                   3 
##                                                                                                            strategy 
##                                                                                                                   4 
##                                                                                                         tightlipped 
##                                                                                                                   1 
##                                                                                                           messenger 
##                                                                                                                   1 
##                                                                                                        photorateapp 
##                                                                                                                   1 
##                                                                                                               worst 
##                                                                                                                   8 
##                                                                                                               anong 
##                                                                                                                   1 
##                                                                                                                 mga 
##                                                                                                                   1 
##                                                                                                            nangyari 
##                                                                                                                   1 
##                                                                                                                niyo 
##                                                                                                                   1 
##                                                                                                           putangina 
##                                                                                                                   1 
##                                                                                                             devises 
##                                                                                                                   1 
##                                                                                                  ideasamsungorapple 
##                                                                                                                   1 
##                                                                                                            innovate 
##                                                                                                                   2 
##                                                                                                         lifebattery 
##                                                                                                                   1 
##                                                                                                               maybe 
##                                                                                                                   6 
##                                                                                                               solar 
##                                                                                                                   3 
##                                                                                                         solariphone 
##                                                                                                                   1 
##                                                                                                              buyers 
##                                                                                                                   1 
##                                                                                                                cnet 
##                                                                                                                   2 
##                                                                                                      httpowly22icvt 
##                                                                                                                   1 
##                                                                                                               ilife 
##                                                                                                                   1 
##                                                                                                       244tsuyoponzu 
##                                                                                                                   6 
##                                                                                                                auto 
##                                                                                                                   3 
##                                                                                             pictwittercomyehjtsjkmj 
##                                                                                                                   1 
##                                                                                                                5sdo 
##                                                                                                                   1 
##                                                                                                              nawwww 
##                                                                                                                   1 
##                                                                                                             neither 
##                                                                                                                   4 
##                                                                                                                nasa 
##                                                                                                                   2 
##                                                                                                                 als 
##                                                                                                                   1 
##                                                                                                             analyse 
##                                                                                                                   1 
##                                                                                                       fysiokerkrade 
##                                                                                                                   1 
##                                                                                                               goede 
##                                                                                                                   1 
##                                                                                                               graag 
##                                                                                                                   1 
##                                                                                                              gratis 
##                                                                                                                   1 
##                                                                                                              helpen 
##                                                                                                                   1 
##                                                                                            httpwwwdatarecuperatienl 
##                                                                                                                   1 
##                                                                                                            iviziapr 
##                                                                                                                   2 
##                                                                                                              middag 
##                                                                                                                   1 
##                                                                                                            recovery 
##                                                                                                                   2 
##                                                                                                               wenst 
##                                                                                                                   1 
##                                                                                                              willen 
##                                                                                                                   1 
##                                                                                                            algilari 
##                                                                                                                   1 
##                                                                                                                 bir 
##                                                                                                                   1 
##                                                                                                               degil 
##                                                                                                                   1 
##                                                                                                         etkileyecek 
##                                                                                                                   1 
##                                                                                                           havasinda 
##                                                                                                                   1 
##                                                                                                            mediacat 
##                                                                                                                   1 
##                                                                                                           niyetinde 
##                                                                                                                   1 
##                                                                                                              ortada 
##                                                                                                                   1 
##                                                                                                                 pek 
##                                                                                                                   1 
##                                                                                                             rekabet 
##                                                                                                                   1 
##                                                                                                                ucuz 
##                                                                                                                   2 
##                                                                                                          yoksanirim 
##                                                                                                                   1 
##                                                                                                             choisir 
##                                                                                                                   1 
##                                                                                                              lequel 
##                                                                                                                   1 
##                                                                                                                 les 
##                                                                                                                   1 
##                                                                                                             nouveau 
##                                                                                                                   1 
##                                                                                                                 oui 
##                                                                                                                   1 
##                                                                                                              morrer 
##                                                                                                                   1 
##                                                                                                            resistir 
##                                                                                                                   1 
##                                                                                                              tentei 
##                                                                                                                   1 
##                                                                                                                 vou 
##                                                                                                                   1 
##                                                                                                                 075 
##                                                                                                                   3 
##                                                                                                        llombardo007 
##                                                                                                                   1 
##                                                                                                               outon 
##                                                                                                                   1 
##                                                                                                             realese 
##                                                                                                                   1 
##                                                                                                                 ahi 
##                                                                                                                   1 
##                                                                                                                 por 
##                                                                                                                   1 
##                                                                                                              sacaba 
##                                                                                                                   1 
##                                                                                                             tambien 
##                                                                                                                   1 
##                                                                                                                tsss 
##                                                                                                                   1 
##                                                                                                             ustedes 
##                                                                                                                   1 
##                                                                                                             deixava 
##                                                                                                                   1 
##                                                                                                                 nao 
##                                                                                                                   1 
##                                                                                                                orra 
##                                                                                                                   1 
##                                                                                                         barackobama 
##                                                                                                                   2 
##                                                                                             pictwittercom1r1qt0tg1d 
##                                                                                                                   1 
##                                                                                                                aint 
##                                                                                                                   6 
##                                                                                                                word 
##                                                                                                                   3 
##                                                                                                                dana 
##                                                                                                                   1 
##                                                                                                          kaldirsana 
##                                                                                                                   1 
##                                                                                                         kilitliyken 
##                                                                                                                   1 
##                                                                                                             olayini 
##                                                                                                                   1 
##                                                                                                                 tek 
##                                                                                                                   1 
##                                                                                                                 tik 
##                                                                                                                   1 
##                                                                                                        blackberryq5 
##                                                                                                                   1 
##                                                                                                               hello 
##                                                                                                                   5 
##                                                                                                                 kat 
##                                                                                                                   1 
##                                                                                                                 kit 
##                                                                                                                   1 
##                                                                                                                hurt 
##                                                                                                                   3 
##                                                                                                              nobody 
##                                                                                                                   3 
##                                                                                                                mute 
##                                                                                                                   3 
##                                                                                             pictwittercomz7vary46yb 
##                                                                                                                   1 
##                                                                                                              select 
##                                                                                                                   1 
##                                                                                                            switcher 
##                                                                                                                   1 
##                                                                                                               white 
##                                                                                                                   7 
##                                                                                                              yellow 
##                                                                                                                   2 
##                                                                                                                alip 
##                                                                                                                   1 
##                                                                                                              dayiya 
##                                                                                                                   1 
##                                                                                                               ettim 
##                                                                                                                   1 
##                                                                                                               hasat 
##                                                                                                                   1 
##                                                                                                           hurmetler 
##                                                                                                                   1 
##                                                                                                               olmus 
##                                                                                                                   1 
##                                                                                                          telefonumu 
##                                                                                                                   1 
##                                                                                                             tesekur 
##                                                                                                                   1 
##                                                                                                            yenisini 
##                                                                                                                   1 
##                                                                                                        yolluomussun 
##                                                                                                                   1 
##                                                                                                       michaeljordan 
##                                                                                                                   5 
##                                                                                                        thephenom007 
##                                                                                                                   1 
##                                                                                                             pricing 
##                                                                                                                   2 
##                                                                                                              sept10 
##                                                                                                                   1 
##                                                                                                            unveiled 
##                                                                                                                   1 
##                                                                                                            andymiah 
##                                                                                                                   2 
##                                                                                             pictwittercomlbxctxbc8g 
##                                                                                                                   1 
##                                                                                                               cause 
##                                                                                                                   3 
##                                                                                                               clear 
##                                                                                                                   3 
##                                                                                                             history 
##                                                                                                                   2 
##                                                                                                            movistar 
##                                                                                                                   4 
##                                                                                                           unlocking 
##                                                                                                                   2 
##                                                                                                                 bro 
##                                                                                                                   2 
##                                                                                                             kidding 
##                                                                                                                   3 
##                                                                                                               peace 
##                                                                                                                   1 
##                                                                                                               sorry 
##                                                                                                                   5 
##                                                                                                               cards 
##                                                                                                                   9 
##                                                                                                        discontinues 
##                                                                                                                   7 
##                                                                                                       httphtlyopzpr 
##                                                                                                                   1 
##                                                                                                            printing 
##                                                                                                                   7 
##                                                                                                          recommends 
##                                                                                                                   7 
##                                                                                                               using 
##                                                                                                                  14 
##                                                                                                               tryna 
##                                                                                                                   2 
##                                                                                                            although 
##                                                                                                                   1 
##                                                                                                               notch 
##                                                                                                                   1 
##                                                                                                             started 
##                                                                                                                   4 
##                                                                                                       strictlygeeky 
##                                                                                                                   1 
##                                                                                                                took 
##                                                                                                                   2 
##                                                                                                                yeah 
##                                                                                                                   4 
##                                                                                                            acciones 
##                                                                                                                   3 
##                                                                                                               bajan 
##                                                                                                                   1 
##                                                                                                                 las 
##                                                                                                                   3 
##                                                                                                     telecelchitchat 
##                                                                                                                   1 
##                                                                                                        yourthoughts 
##                                                                                                                   1 
##                                                                                                          zifmstereo 
##                                                                                                                   1 
##                                                                                                              anyway 
##                                                                                                                   3 
##                                                                                                         inspiration 
##                                                                                                                   1 
##                                                                                                               kinda 
##                                                                                                                   1 
##                                                                                                               looks 
##                                                                                                                   7 
##                                                                                                                 sup 
##                                                                                                                   2 
##                                                                                                       httpowlyolcgw 
##                                                                                                                   1 
##                                                                                                             unveils 
##                                                                                                                   1 
##                                                                                                              rasnaj 
##                                                                                                                   1 
##                                                                                                                huhu 
##                                                                                                                   1 
##                                                                                                          jmflooores 
##                                                                                                                   1 
##                                                                                                                onga 
##                                                                                                                   1 
##                                                                                             pictwittercomndim3qbsb2 
##                                                                                                                   1 
##                                                                                                            somebody 
##                                                                                                                   1 
##                                                                                                         americascup 
##                                                                                                                   1 
##                                                                                                              course 
##                                                                                                                   4 
##                                                                                                      emiratesteamnz 
##                                                                                                                   1 
##                                                                                                           mirroring 
##                                                                                                                   1 
##                                                                                                               22000 
##                                                                                                                   1 
##                                                                                                                sans 
##                                                                                                                   1 
##                                                                                                               tweet 
##                                                                                                                   2 
##                                                                                                              months 
##                                                                                                                   3 
##                                                                                                              talked 
##                                                                                                                   2 
##                                                                                                              though 
##                                                                                                                   3 
##                                                                                                             nokiaus 
##                                                                                                                   2 
##                                                                                                     ooooooooooooooo 
##                                                                                                                   1 
##                                                                                                            tiagouss 
##                                                                                                                   1 
##                                                                                                              wanted 
##                                                                                                                   3 
##                                                                                                                 add 
##                                                                                                                   5 
##                                                                                                               power 
##                                                                                                                   1 
##                                                                                                               steal 
##                                                                                                                   1 
##                                                                                              httpyoutubepfsj3ilxifu 
##                                                                                                                   1 
##                                                                                                              scenes 
##                                                                                                                   1 
##                                                                                                              frente 
##                                                                                                                   1 
##                                                                                                              golazo 
##                                                                                                                   1 
##                                                                                                         lanzamiento 
##                                                                                                                   2 
##                                                                                                             mejores 
##                                                                                                                   1 
##                                                                                                             nokiaco 
##                                                                                                                   1 
##                                                                                             pictwittercomdxzz9vibo7 
##                                                                                                                   1 
##                                                                                                          reacciones 
##                                                                                                                   1 
##                                                                                                               visto 
##                                                                                                                   1 
##                                                                                                                 550 
##                                                                                                                   1 
##                                                                                                           amerikada 
##                                                                                                                   1 
##                                                                                                            bilinmez 
##                                                                                                                   1 
##                                                                                                               diyip 
##                                                                                                                   1 
##                                                                                                              dolara 
##                                                                                                                   1 
##                                                                                                                haci 
##                                                                                                                   1 
##                                                                                                                 inc 
##                                                                                                                   3 
##                                                                                                                kimi 
##                                                                                                                   1 
##                                                                                                              sation 
##                                                                                                                   1 
##                                                                                                               sayin 
##                                                                                                                   1 
##                                                                                                                 sen 
##                                                                                                                   1 
##                                                                                                            telefonu 
##                                                                                                                   1 
##                                                                                                           turkiyede 
##                                                                                                                   1 
##                                                                                                             yapicam 
##                                                                                                                   1 
##                                                                                                               yiyon 
##                                                                                                                   1 
##                                                                                                             display 
##                                                                                                                   2 
##                                                                                                         thunderbolt 
##                                                                                                                   1 
##                                                                                                             iltifat 
##                                                                                                                   1 
##                                                                                                                 iyi 
##                                                                                                                   1 
##                                                                                                            seklidir 
##                                                                                                                   1 
##                                                                                                              taklit 
##                                                                                                                   1 
##                                                                                                                algo 
##                                                                                                                   1 
##                                                                                                             navidad 
##                                                                                                                   1 
##                                                                                                           regalenme 
##                                                                                                                   1 
##                                                                                                               china 
##                                                                                                                   8 
##                                                                                                 httpcnnmonie1eur90v 
##                                                                                                                   1 
##                                                                                                              regain 
##                                                                                                                   1 
##                                                                                             pictwittercomm4o7aewgr3 
##                                                                                                                   1 
##                                                                                                            southern 
##                                                                                                                   1 
##                                                                                                                alum 
##                                                                                                                   1 
##                                                                                                                 apa 
##                                                                                                                   1 
##                                                                                                       artcenteralum 
##                                                                                                                   1 
##                                                                                                          carsharing 
##                                                                                                                   1 
##                                                                                                     httpbitlywkjhyg 
##                                                                                                                   1 
##                                                                                                                 igo 
##                                                                                                                   1 
##                                                                                                                 nih 
##                                                                                                                   1 
##                                                                                             pictwittercomyzh6o5yzlx 
##                                                                                                                   1 
##                                                                                                             project 
##                                                                                                                   2 
##                                                                                                                 wah 
##                                                                                                                   1 
##                                                                                                                 3gs 
##                                                                                                                   1 
##                                                                                                             compare 
##                                                                                                                   1 
##                                                                                                              galaxy 
##                                                                                                                   2 
##                                                                                                     theamazingsimon 
##                                                                                                                   1 
##                                                                                                               times 
##                                                                                                                   5 
##                                                                                                        unfavourably 
##                                                                                                                   1 
##                                                                                                                4eva 
##                                                                                                                   1 
##                                                                                                               quick 
##                                                                                                                   3 
##                                                                                             pictwittercom7etawoyaut 
##                                                                                                                   1 
##                                                                                                              buying 
##                                                                                                                   4 
##                                                                                                            glitches 
##                                                                                                                   1 
##                                                                                                               email 
##                                                                                                                   5 
##                                                                                                        arianagrande 
##                                                                                                                   1 
##                                                                                                         ellenpompeo 
##                                                                                                                   1 
##                                                                                                           katewalsh 
##                                                                                                                   1 
##                                                                                                                 oth 
##                                                                                                                   1 
##                                                                                                      starworldindia 
##                                                                                                                   1 
##                                                                                                                100m 
##                                                                                                                   1 
##                                                                                                            building 
##                                                                                                                   1 
##                                                                                                              hosain 
##                                                                                                                   1 
##                                                                                                     httpgoogl3uip5u 
##                                                                                                                   1 
##                                                                                                             jawbone 
##                                                                                                                   1 
##                                                                                                              raises 
##                                                                                                                   1 
##                                                                                                          unexpected 
##                                                                                                                   1 
##                                                                                                        alfredopetas 
##                                                                                                                   1 
##                                                                                                     definitivamente 
##                                                                                                                   1 
##                                                                                                                 del 
##                                                                                                                   3 
##                                                                                                                 hay 
##                                                                                                                   1 
##                                                                                                               lmuia 
##                                                                                                                   2 
##                                                                                                           manoloe69 
##                                                                                                                   2 
##                                                                                                                paso 
##                                                                                                                   1 
##                                                                                                                pero 
##                                                                                                                   1 
##                                                                                                            yatayoye 
##                                                                                                                   2 
##                                                                                                                ante 
##                                                                                                                   2 
##                                                                                                              chinos 
##                                                                                                                   2 
##                                                                                                        dispositivos 
##                                                                                                                   2 
##                                                                                                       httpowlyoooo5 
##                                                                                                                   2 
##                                                                                                          sorprenden 
##                                                                                                                   2 
##                                                                                                            usuarios 
##                                                                                                                   2 
##                                                                                                              rather 
##                                                                                                                   4 
##                                                                                                                beja 
##                                                                                                                   1 
##                                                                                                                nike 
##                                                                                                                   2 
##                                                                                                                race 
##                                                                                                                   2 
##                                                                                                               sauto 
##                                                                                                                   1 
##                                                                                                                 wlh 
##                                                                                                                   1 
##                                                                                                                1085 
##                                                                                                                   3 
##                                                                                                          apportando 
##                                                                                                                   1 
##                                                                                                correzionifreelysoft 
##                                                                                                                   1 
##                                                                                                      laggiornamento 
##                                                                                                                   1 
##                                                                                                            numerose 
##                                                                                                                   1 
##                                                                                             pictwittercomrauzjtpf60 
##                                                                                                                   1 
##                                                                                                            rilascia 
##                                                                                                                   1 
##                                                                                                           engineers 
##                                                                                                                   2 
##                                                                                                                hire 
##                                                                                                                   1 
##                                                                                                     httpflipitwphdk 
##                                                                                                                   1 
##                                                                                                                 ceo 
##                                                                                                                   4 
##                                                                                                  httpbloombg1d6rhg6 
##                                                                                                                   1 
##                                                                                                               looms 
##                                                                                                                   1 
##                                                                                                           mcandrews 
##                                                                                                                   1 
##                                                                                                               names 
##                                                                                                                   1 
##                                                                                                             pandora 
##                                                                                                                   3 
##                                                                                                             veteran 
##                                                                                                                   1 
##                                                                                                   httpsdrvms17vnhha 
##                                                                                                                   1 
##                                                                                                                 wp8 
##                                                                                                                   1 
##                                                                                                           wpcentral 
##                                                                                                                   1 
##                                                                                             pictwittercomxdkgjfx6cn 
##                                                                                                                   1 
##                                                                                                   http4sqcom18lrqgl 
##                                                                                                                   1 
##                                                                                                                park 
##                                                                                                                   3 
##                                                                                                             pculnan 
##                                                                                                                   1 
##                                                                                                                ross 
##                                                                                                                   2 
##                                                                                                                info 
##                                                                                                                   2 
##                                                                                                               needs 
##                                                                                                                   7 
##                                                                                                    paperworkpatient 
##                                                                                                                   1 
##                                                                                                       previoustweet 
##                                                                                                                   1 
##                                                                                                      simultaneously 
##                                                                                                                   1 
##                                                                                                          workingirl 
##                                                                                                                   1 
##                                                                                                         coprocessor 
##                                                                                                                   1 
##                                                                                                          healthcare 
##                                                                                                                   1 
##                                                                               httphealthcareoperationsmanagementnet 
##                                                                                                                   1 
##                                                                                                             mhealth 
##                                                                                                                   1 
##                                                                                                              theres 
##                                                                                                                   3 
##                                                                                                                 att 
##                                                                                                                   3 
##                                                                                                              listen 
##                                                                                                                   1 
##                                                                                                               banca 
##                                                                                                                   3 
##                                                                                                               culpa 
##                                                                                                                   3 
##                                                                                                            josiando 
##                                                                                                                   1 
##                                                                                                             lisbeld 
##                                                                                                                   1 
##                                                                                                              manita 
##                                                                                                                   2 
##                                                                                                         mizbuchitos 
##                                                                                                                   2 
##                                                                                                                rota 
##                                                                                                                   3 
##                                                                                                              tengan 
##                                                                                                                   1 
##                                                                                                                 toi 
##                                                                                                                   1 
##                                                                                                               beard 
##                                                                                                                   1 
##                                                                                                       ghosttgamings 
##                                                                                                                   1 
##                                                                                                            internet 
##                                                                                                                   6 
##                                                                                                              invent 
##                                                                                                                   2 
##                                                                                                        bretfordmanf 
##                                                                                                                   1 
##                                                                                                                cart 
##                                                                                                                   1 
##                                                                                                        deployment13 
##                                                                                                                   1 
##                                                                                           httpcolefarrellmeprojects 
##                                                                                                                   1 
##                                                                                                           materials 
##                                                                                                                   2 
##                                                                                                               mbair 
##                                                                                                                   1 
##                                                                                                           packaging 
##                                                                                                                   1 
##                                                                                                            retrofit 
##                                                                                                                   1 
##                                                                                                             reusing 
##                                                                                                                   1 
##                                                                                                                 a7s 
##                                                                                                                   1 
##                                                                                                               chips 
##                                                                                                                   2 
##                                                                                                            fullsize 
##                                                                                                                   1 
##                                                                                                                odds 
##                                                                                                                   1 
##                                                                                                           computers 
##                                                                                                                   1 
##                                                                                                           kemalnads 
##                                                                                                                   2 
##                                                                                                     mrpumpkinslicer 
##                                                                                                                   1 
##                                                                                                      randominventor 
##                                                                                                                   1 
##                                                                                                      xxswegboy069xx 
##                                                                                                                   1 
##                                                                                                     securitycompass 
##                                                                                                                   1 
##                                                                                                          aggressive 
##                                                                                                                   1 
##                                                                                                            channels 
##                                                                                                                   1 
##                                                                                                           discounts 
##                                                                                                                   2 
##                                                                                                               drive 
##                                                                                                                   2 
##                                                                                                       httpowlyop1xh 
##                                                                                                                   1 
##                                                                                                                thru 
##                                                                                                                   1 
##                                                                                                                unit 
##                                                                                                                   1 
##                                                                                                             volumes 
##                                                                                                                   1 
##                                                                                                             walmart 
##                                                                                                                   2 
##                                                                                                          appleberry 
##                                                                                                                   1 
##                                                                                                               berry 
##                                                                                                                   1 
##                                                                                                          blackapple 
##                                                                                                                   1 
##                                                                                                                guts 
##                                                                                                                   1 
##                                                                                                                heck 
##                                                                                                                   5 
##                                                                                                            keyboard 
##                                                                                                                   2 
##                                                                                                             mhughes 
##                                                                                                                   1 
##                                                                                                             brengen 
##                                                                                                                   1 
##                                                                                                                 een 
##                                                                                                                   2 
##                                                                                                              europa 
##                                                                                                                   1 
##                                                                                                              fysiek 
##                                                                                                                   1 
##                                                                                                                 htc 
##                                                                                                                   1 
##                                                                                                               markt 
##                                                                                                                   1 
##                                                                                                               omdat 
##                                                                                                                   1 
##                                                                                                           ontvolgen 
##                                                                                                                   1 
##                                                                                                                sony 
##                                                                                                                   1 
##                                                                                                         toetsenbord 
##                                                                                                                   1 
##                                                                                                           verdommen 
##                                                                                                                   1 
##                                                                                                                 lan 
##                                                                                                                   1 
##                                                                                             pictwittercomi0ega8iohp 
##                                                                                                                   1 
##                                                                                                                saka 
##                                                                                                                   1 
##                                                                                                             capture 
##                                                                                                                   1 
##                                                                                                              cupert 
##                                                                                                                   1 
##                                                                                                    httpbitly1g9fk2t 
##                                                                                                                   1 
##                                                                                                               press 
##                                                                                                                   2 
##                                                                                                                uses 
##                                                                                                                   3 
##                                                                                             pictwittercomp1yhsjjfzz 
##                                                                                                                   1 
##                                                                                                              5cheap 
##                                                                                                                   2 
##                                                                                                               5same 
##                                                                                                                   1 
##                                                                                                      httpowly22kxvv 
##                                                                                                                   1 
##                                                                                                               aware 
##                                                                                                                   1 
##                                                                                                        capitalizing 
##                                                                                                                   1 
##                                                                                                               drops 
##                                                                                                                   3 
##                                                                                                       httpowlyonxpx 
##                                                                                                                   1 
##                                                                                                          phenomenon 
##                                                                                                                   1 
##                                                                                                             todaybe 
##                                                                                                                   1 
##                                                                                                           trendlabs 
##                                                                                                                   1 
##                                                                                                          trendmicro 
##                                                                                                                   1 
##                                                                                                           mogsharif 
##                                                                                                                   2 
##                                                                                                           veryright 
##                                                                                                                   1 
##                                                                                                                beli 
##                                                                                                                   1 
##                                                                                                               dunia 
##                                                                                                                   1 
##                                                                                                             inovasi 
##                                                                                                                   1 
##                                                                                                                kalo 
##                                                                                                                   2 
##                                                                                                          kepintaran 
##                                                                                                                   1 
##                                                                                                            konsumen 
##                                                                                                                   1 
##                                                                                                                lagi 
##                                                                                                                   1 
##                                                                                                               makin 
##                                                                                                                   1 
##                                                                                                               masih 
##                                                                                                                   1 
##                                                                                                             ngapain 
##                                                                                                                   1 
##                                                                                                             ngetest 
##                                                                                                                   1 
##                                                                                                                pada 
##                                                                                                                   1 
##                                                                                                               yakin 
##                                                                                                                   1 
##                                                                                                               lines 
##                                                                                                                   2 
##                                                                                                             ungodly 
##                                                                                                                   1 
##                                                                                                                 dla 
##                                                                                                                   1 
##                                                                                                             hejtuje 
##                                                                                                                   1 
##                                                                                                           myapplepl 
##                                                                                                                   1 
##                                                                                                           najlepsze 
##                                                                                                                   1 
##                                                                                                               nigdy 
##                                                                                                                   1 
##                                                                                                          produktami 
##                                                                                                                   1 
##                                                                                                          stycznosci 
##                                                                                                                   1 
##                                                                                                                 tak 
##                                                                                                                   1 
##                                                                                                                 ten 
##                                                                                                                   1 
##                                                                                                               tylko 
##                                                                                                                   1 
##                                                                                                               wielu 
##                                                                                                                   1 
##                                                                                                              zostac 
##                                                                                                                   1 
##                                                                                                                 000 
##                                                                                                                   1 
##                                                                                                              compte 
##                                                                                                                   1 
##                                                                                                               crois 
##                                                                                                                   1 
##                                                                                                               juste 
##                                                                                                                   1 
##                                                                                                                 nom 
##                                                                                                                   1 
##                                                                                                                pour 
##                                                                                                                   1 
##                                                                                                                 nsa 
##                                                                                                                  10 
##                                                                                                             verizon 
##                                                                                                                   3 
##                                                                                                     verizonwireless 
##                                                                                                                   3 
##                                                                                                          whitehouse 
##                                                                                                                   1 
##                                                                                                               yahoo 
##                                                                                                                   1 
##                                                                                                                axel 
##                                                                                                                   1 
##                                                                                                   http4sqcom14qtges 
##                                                                                                                   1 
##                                                                                                             meeting 
##                                                                                                                   1 
##                                                                                                            plugplay 
##                                                                                                                   1 
##                                                                                                            springer 
##                                                                                                                   1 
##                                                                                                             anuncio 
##                                                                                                                   1 
##                                                                                                                baja 
##                                                                                                                   1 
##                                                                                                               bolsa 
##                                                                                                                   1 
##                                                                                                    httpbitly17wvapz 
##                                                                                                                   1 
##                                                                                                                tras 
##                                                                                                                   1 
##                                                                                                           education 
##                                                                                                                   1 
##                                                                                                      httpgooglwktt0 
##                                                                                                                   1 
##                                                                                                             ischool 
##                                                                                                                   1 
##                                                                                                                 099 
##                                                                                                                   1 
##                                                                                                            asphalt8 
##                                                                                                                   1 
##                                                                                                                2004 
##                                                                                                                   1 
##                                                                                                                fool 
##                                                                                                                   3 
##                                                                                                              series 
##                                                                                                                   1 
##                                                                                                          dynamictim 
##                                                                                                                   1 
##                                                                                                         trustworthy 
##                                                                                                                   1 
##                                                                                                   httpfbme3ehihnvdn 
##                                                                                                                   1 
##                                                                                                               jimmy 
##                                                                                                                   1 
##                                                                                                              kimmel 
##                                                                                                                   1 
##                                                                                                               tells 
##                                                                                                                   4 
##                                                                                                                 gen 
##                                                                                                                   1 
##                                                                                                               lower 
##                                                                                                                   3 
##                                                                                                              priced 
##                                                                                                                   1 
##                                                                                                              tablet 
##                                                                                                                   1 
##                                                                                                               dyson 
##                                                                                                                   1 
##                                                                                                                exit 
##                                                                                                                   1 
##                                                                                                               joint 
##                                                                                                                   1 
##                                                                                                             markets 
##                                                                                                                   1 
##                                                                                                         phonevacuum 
##                                                                                                                   1 
##                                                                                                    httpdlvrit3ybllz 
##                                                                                                                   1 
##                                                                                                        autocomplete 
##                                                                                                                   1 
##                                                                                                                bold 
##                                                                                                                   1 
##                                                                                                             cursing 
##                                                                                                                   1 
##                                                                                                              enough 
##                                                                                                                   5 
##                                                                                                   applequestionierr 
##                                                                                                                   1 
##                                                                                                           favourite 
##                                                                                                                   1 
##                                                                                                               fruit 
##                                                                                                                   1 
##                                                                                                           mikesleek 
##                                                                                                                   1 
##                                                                                                                 tmk 
##                                                                                                                   1 
##                                                                                                               30aud 
##                                                                                                                   1 
##                                                                                                             anybody 
##                                                                                                                   2 
##                                                                                                           batteries 
##                                                                                                                   2 
##                                                                                                              issues 
##                                                                                                                   1 
##                                                                                                          magicmouse 
##                                                                                                                   1 
##                                                                                                        rechargeable 
##                                                                                                                   1 
##                                                                                                             betalen 
##                                                                                                                   1 
##                                                                                                                 bom 
##                                                                                                                   1 
##                                                                                                                doet 
##                                                                                                                   1 
##                                                                                                              gelegd 
##                                                                                                                   1 
##                                                                                                               heeft 
##                                                                                                                   2 
##                                                                                                     httpbitlyyh1pyu 
##                                                                                                                   5 
##                                                                                                                 mee 
##                                                                                                                   1 
##                                                                                                              mobiel 
##                                                                                                                   1 
##                                                                                                                niet 
##                                                                                                                   1 
##                                                                                                              nieuws 
##                                                                                                                   2 
##                                                                                                               onder 
##                                                                                                                   1 
##                                                                                                           tegenslag 
##                                                                                                                   1 
##                                                                                                                voor 
##                                                                                                                   2 
##                                                                                                              aheaux 
##                                                                                                                   2 
##                                                                                                               carry 
##                                                                                                                   2 
##                                                                                                     virginmobileusa 
##                                                                                                                   1 
##                                                                                                        battalalgoos 
##                                                                                                                   3 
##                                                                                                              dengan 
##                                                                                                                   1 
##                                                                                                                emas 
##                                                                                                                   1 
##                                                                                                                main 
##                                                                                                                   1 
##                                                                                                                mata 
##                                                                                                                   1 
##                                                                                                               warna 
##                                                                                                                   1 
##                                                                                                             cambiar 
##                                                                                                                   1 
##                                                                                                                celu 
##                                                                                                                   1 
##                                                                                                               chile 
##                                                                                                                   1 
##                                                                                                                 con 
##                                                                                                                   2 
##                                                                                                               entel 
##                                                                                                                   1 
##                                                                                                               hagan 
##                                                                                                                   1 
##                                                                                                              llegan 
##                                                                                                                   1 
##                                                                                                               menos 
##                                                                                                                   2 
##                                                                                                           problemas 
##                                                                                                                   1 
##                                                                                                              vienen 
##                                                                                                                   1 
##                                                                                                                 777 
##                                                                                                                   1 
##                                                                                                           countries 
##                                                                                                                   1 
##                                                                                                               event 
##                                                                                                                   6 
##                                                                                                                ship 
##                                                                                                                   2 
##                                                                                                                 300 
##                                                                                                                   2 
##                                                                                                                 900 
##                                                                                                                   1 
##                                                                                                                 917 
##                                                                                                                   1 
##                                                                                                               adobe 
##                                                                                                                   1 
##                                                                                                           challenge 
##                                                                                                                   1 
##                                                                                                                dell 
##                                                                                                                   2 
##                                                                                                                fair 
##                                                                                                                   1 
##                                                                                                                reps 
##                                                                                                                   1 
##                                                                                                             yurbuds 
##                                                                                                                   1 
##                                                                                                               fancy 
##                                                                                                                   1 
##                                                                                                   httphuffto1fxeibw 
##                                                                                                                   1 
##                                                                                                        huffposttech 
##                                                                                                                   1 
##                                                                                                                cb4g 
##                                                                                                                   1 
##                                                                                                       httpowlyoqwmp 
##                                                                                                                   1 
##                                                                                                              monday 
##                                                                                                                   1 
##                                                                                                          phonebloks 
##                                                                                                                   2 
##                                                                                                          collection 
##                                                                                                                   1 
##                                                                                                    httpbitly18couwn 
##                                                                                                                   1 
##                                                                                                            showcase 
##                                                                                                                   1 
##                                                                                                                 shy 
##                                                                                                                   1 
##                                                                                                             teaming 
##                                                                                                                   2 
##                                                                                                            upcoming 
##                                                                                                                   1 
##                                                                                                       httphtlyopzpm 
##                                                                                                                   1 
##                                                                                                           chiiiique 
##                                                                                                                   1 
##                                                                                                        editoradraco 
##                                                                                                                   1 
##                                                                                                             changed 
##                                                                                                                   1 
##                                                                                                       httpowlyomlds 
##                                                                                                                   1 
##                                                                                                           investors 
##                                                                                                                   2 
##                                                                                                               chief 
##                                                                                                                   1 
##                                                                                                        chrischorner 
##                                                                                                                   1 
##                                                                                                               exepa 
##                                                                                                                   1 
##                                                                                                             jackson 
##                                                                                                                   1 
##                                                                                                            jocofino 
##                                                                                                                   2 
##                                                                                                                lisa 
##                                                                                                                   1 
##                                                                                                         marcgunther 
##                                                                                                                   1 
##                                                                                                             richard 
##                                                                                                                   1 
##                                                                                                           windsorer 
##                                                                                                                   1 
##                                                                                                              unlook 
##                                                                                                                   1 
##                                                                                                    httpfbmegh5nfcbe 
##                                                                                                                   1 
##                                                                                                          ibookstore 
##                                                                                                                   1 
##                                                                                                           lusalazar 
##                                                                                                                   2 
##                                                                                                               morte 
##                                                                                                                   1 
##                                                                                                                olha 
##                                                                                                                   1 
##                                                                                                               toque 
##                                                                                                                   1 
##                                                                                                                dave 
##                                                                                                                   1 
##                                                                                                       davetwentyman 
##                                                                                                                   1 
##                                                                                                             jedipad 
##                                                                                                                   1 
##                                                                                                               pitch 
##                                                                                                                   1 
##                                                                                                       blindoldfreak 
##                                                                                                                   1 
##                                                                                                            shouldnt 
##                                                                                                                   2 
##                                                                                                                side 
##                                                                                                                   1 
##                                                                                                               throw 
##                                                                                                                   1 
##                                                                                                     httpgoogl4jmh1h 
##                                                                                                                   1 
##                                                                                                                isnt 
##                                                                                                                  11 
##                                                                                                               lists 
##                                                                                                                   1 
##                                                                                                              phonen 
##                                                                                                                   1 
##                                                                                                          understand 
##                                                                                                                   4 
##                                                                                                            applewhy 
##                                                                                                                   1 
##                                                                                                       differentiate 
##                                                                                                                   1 
##                                                                                                                hate 
##                                                                                                                  19 
##                                                                                                                 jab 
##                                                                                                                   1 
##                                                                                                               metro 
##                                                                                                                   2 
##                                                                                                          confession 
##                                                                                                                   1 
##                                                                                                          wallpapers 
##                                                                                                                   1 
##                                                                                                              banget 
##                                                                                                                   1 
##                                                                                                              berasa 
##                                                                                                                   1 
##                                                                                                                 deh 
##                                                                                                                   1 
##                                                                                                          inovasinya 
##                                                                                                                   1 
##                                                                                                               lihat 
##                                                                                                                   1 
##                                                                                                               meski 
##                                                                                                                   1 
##                                                                                                               pelit 
##                                                                                                                   1 
##                                                                                                          presentasi 
##                                                                                                                   1 
##                                                                                                            pridenya 
##                                                                                                                   1 
##                                                                                                              produk 
##                                                                                                                   1 
##                                                                                                              selalu 
##                                                                                                                   1 
##                                                                                                              seneng 
##                                                                                                                   1 
##                                                                                                    httpdlvrit3ylvbd 
##                                                                                                                   1 
##                                                                                                       byondbeauty09 
##                                                                                                                   1 
##                                                                                                                cons 
##                                                                                                                   1 
##                                                                                                  httpatlawcom7rs7xt 
##                                                                                                                   1 
##                                                                                                         lawtechnews 
##                                                                                                                   1 
##                                                                                                                pros 
##                                                                                                                   1 
##                                                                                                              arabic 
##                                                                                                                   1 
##                                                                                                               write 
##                                                                                                                   2 
##                                                                                                               bonus 
##                                                                                                                   1 
##                                                                                                              driven 
##                                                                                                                   1 
##                                                                                                           execution 
##                                                                                                                   1 
##                                                                                                              glehel 
##                                                                                                                   1 
##                                                                                                       httpowlyoqo28 
##                                                                                                                   1 
##                                                                                                         personality 
##                                                                                                                   1 
##                                                                                                          prediction 
##                                                                                                                   1 
##                                                                                                               sauce 
##                                                                                                                   1 
##                                                                                                              secret 
##                                                                                                                   1 
##                                                                                                             startup 
##                                                                                                                   1 
##                                                                                                               derek 
##                                                                                                                   1 
##                                                                                                             holdold 
##                                                                                                                   1 
##                                                                                                   httpfbme2ckpba4ut 
##                                                                                                                   1 
##                                                                                                               breve 
##                                                                                                                   1 
##                                                                                                             saraiva 
##                                                                                                                   1 
##                                                                                                               glass 
##                                                                                                                   2 
##                                                                                                            includes 
##                                                                                                                   1 
##                                                                                                            lighting 
##                                                                                                                   1 
##                                                                                                              oblong 
##                                                                                                                   1 
##                                                                                                            recessed 
##                                                                                                                   1 
##                                                                                                          storefront 
##                                                                                                                   1 
##                                                                                                              tables 
##                                                                                                                   1 
##                                                                                                           trademark 
##                                                                                                                   1 
##                                                                                                         trademarked 
##                                                                                                                   1 
##                                                                                                          anunciarse 
##                                                                                                                   1 
##                                                                                                           aprovecha 
##                                                                                                                   1 
##                                                                                                           cobertura 
##                                                                                                                   1 
##                                                                                                    httpbitly17y3cmg 
##                                                                                                                   1 
##                                                                                                           favoritas 
##                                                                                                                   1 
##                                                                                                    httpbitly13ry27k 
##                                                                                                                   1 
##                                                                                                              marcas 
##                                                                                                                   1 
##                                                                                                                 son 
##                                                                                                                   2 
##                                                                                                                camp 
##                                                                                                                   1 
##                                                                                                              entire 
##                                                                                                                   1 
##                                                                                                                line 
##                                                                                                                   4 
##                                                                                                       wheremyringat 
##                                                                                                                   1 
##                                                                                                       doctorveritas 
##                                                                                                                   1 
##                                                                                                               2week 
##                                                                                                                   1 
##                                                                                                               delay 
##                                                                                                                   1 
##                                                                                                               5slfw 
##                                                                                                                   1 
##                                                                                              httpyoutube4il5cerxp4a 
##                                                                                                                   1 
##                                                                                                                ss14 
##                                                                                                                   1 
##                                                                                                          womenswear 
##                                                                                                                   1 
##                                                                                             pictwittercomkkq8femp04 
##                                                                                                                   1 
##                                                                                             pictwittercom8itaoafkp2 
##                                                                                                                   1 
##                                                                                                                 211 
##                                                                                                                   1 
##                                                                                                        howswelegant 
##                                                                                                                   2 
##                                                                                                              tragic 
##                                                                                                                   1 
##                                                                                             pictwittercomjhis5eispg 
##                                                                                                                   1 
##                                                                                                    httpbitly17qodni 
##                                                                                                                   1 
##                                                                                                          bozaagency 
##                                                                                                                   1 
##                                                                                                    topicshighlights 
##                                                                                                                   1 
##                                                                                                               quite 
##                                                                                                                   3 
##                                                                                                                1415 
##                                                                                                                   1 
##                                                                                                           adventure 
##                                                                                                                   1 
##                                                                                                              donate 
##                                                                                                                   1 
##                                                                                                               shout 
##                                                                                                                   1 
##                                                                                                   http4sqcom1eiaj4s 
##                                                                                                                   1 
##                                                                                                          pittsburgh 
##                                                                                                                   1 
##                                                                                                             fingers 
##                                                                                                                   2 
##                                                                                                               image 
##                                                                                                                   1 
##                                                                                                             imaging 
##                                                                                                                   1 
##                                                                                                               issue 
##                                                                                                                   3 
##                                                                                                             precise 
##                                                                                                                   1 
##                                                                                                             sensors 
##                                                                                                                   1 
##                                                                                                             typical 
##                                                                                                                   1 
##                                                                                                                 wet 
##                                                                                                                   1 
##                                                                                                              nstuff 
##                                                                                                                   1 
##                                                                                                              inakua 
##                                                                                                                   1 
##                                                                                                                kama 
##                                                                                                                   1 
##                                                                                                           kufikiria 
##                                                                                                                   1 
##                                                                                                penyevatimetufikisha 
##                                                                                                                   1 
##                                                                                                              wacwac 
##                                                                                                                   1 
##                                                                                                        counterpoint 
##                                                                                                                   1 
##                                                                                                    httpsshrlcpj5yjp 
##                                                                                                                   1 
##                                                                                                         shareaholic 
##                                                                                                                   1 
##                                                                                                             xconomy 
##                                                                                                                   1 
##                                                                                                                 ans 
##                                                                                                                   1 
##                                                                                                             desktop 
##                                                                                                                   1 
##                                                                                                           installed 
##                                                                                                                   1 
##                                                                                             pictwittercom4cfp5lk6hz 
##                                                                                                                   1 
##                                                                                                               tiles 
##                                                                                                                   1 
##                                                                                                             behappy 
##                                                                                                                   1 
##                                                                                                                fuel 
##                                                                                                                   2 
##                                                                                                       facebooktocom 
##                                                                                                                   1 
##                                                                                                   httpfbme1s22iorjt 
##                                                                                                                   1 
##                                                                                                       presentsapple 
##                                                                                                                   1 
##                                                                                                             store12 
##                                                                                                                   1 
##                                                                                                     bewegingsproces 
##                                                                                                                   1 
##                                                                                                  bewegingsprocessor 
##                                                                                                                   1 
##                                                                                                            gebruikt 
##                                                                                                                   1 
##                                                                                                               grote 
##                                                                                                                   1 
##                                                                                                             plannen 
##                                                                                                                   1 
##                                                                                                                cook 
##                                                                                                                   4 
##                                                                                                              copied 
##                                                                                                                   1 
##                                                                                                                john 
##                                                                                                                   1 
##                                                                                                              onewho 
##                                                                                                                   1 
##                                                                                                            recipies 
##                                                                                                                   1 
##                                                                                                             tempted 
##                                                                                                                   1 
##                                                                                                                 tim 
##                                                                                                                   2 
##                                                                                                               tried 
##                                                                                                                   2 
##                                                                                                               whose 
##                                                                                                                   1 
##                                                                                                               crocs 
##                                                                                                                   2 
##                                                                                                      xfrancesjoanna 
##                                                                                                                   1 
##                                                                                                              copies 
##                                                                                                                   1 
##                                                                                                               early 
##                                                                                                                   2 
##                                                                                                                 jay 
##                                                                                                                   1 
##                                                                                                          magnacarta 
##                                                                                                                   1 
##                                                                                                     samsungmobileus 
##                                                                                                                   1 
##                                                                                                        thegoldalbum 
##                                                                                                                   1 
##                                                                                                                tyga 
##                                                                                                                   1 
##                                                                                                                cago 
##                                                                                                                   1 
##                                                                                                             muertos 
##                                                                                                                   1 
##                                                                                                                 tus 
##                                                                                                                   1 
##                                                                                                                calm 
##                                                                                                                   1 
##                                                                                                           clarifies 
##                                                                                                                   1 
##                                                                                                               fears 
##                                                                                                                   1 
##                                                                                                    httpfbmet2axa0ty 
##                                                                                                                   1 
##                                                                                                           potential 
##                                                                                                                   2 
##                                                                                                             storage 
##                                                                                                                   3 
##                                                                                                            generate 
##                                                                                                                   1 
##                                                                                                           regulates 
##                                                                                                                   1 
##                                                                                                             revenue 
##                                                                                                                   1 
##                                                                                                                sold 
##                                                                                                                   4 
##                                                                                                            benigeri 
##                                                                                                                   1 
##                                                                                                               given 
##                                                                                                                   1 
##                                                                                                             ibeacon 
##                                                                                                                   2 
##                                                                                                            partners 
##                                                                                                                   1 
##                                                                                                                paul 
##                                                                                                                   1 
##                                                                                                           wondering 
##                                                                                                                   1 
##                                                                                                   httpbuffly1em7i8r 
##                                                                                                                   1 
##                                                                                                           diciembre 
##                                                                                                                   1 
##                                                                                                              tendre 
##                                                                                                                   1 
##                                                                                                           confirmed 
##                                                                                                                   1 
##                                                                                                   httpusatly1eebgce 
##                                                                                                                   1 
##                                                                                                            usatoday 
##                                                                                                                   2 
##                                                                                                                adds 
##                                                                                                                   1 
##                                                                                                            applecom 
##                                                                                                                   2 
##                                                                                                                girl 
##                                                                                                                   1 
##                                                                                                             include 
##                                                                                                                   1 
##                                                                                                              phones 
##                                                                                                                  11 
##                                                                                                            fairlawn 
##                                                                                                                   1 
##                                                                                                   http4sqcom14gb9qw 
##                                                                                                                   1 
##                                                                                                                mall 
##                                                                                                                   1 
##                                                                                                              summit 
##                                                                                                                   1 
##                                                                                                       consumerbased 
##                                                                                                                   1 
##                                                                                                            decision 
##                                                                                                                   1 
##                                                                                                               worse 
##                                                                                                                   3 
##                                                                                                         waathaaaaan 
##                                                                                                                   1 
##                                                                                                             another 
##                                                                                                                   3 
##                                                                                                               false 
##                                                                                                                   1 
##                                                                                             pictwittercomdbwtly6moh 
##                                                                                                                   1 
##                                                                                                         analogdanny 
##                                                                                                                   1 
##                                                                                                                 kms 
##                                                                                                                   1 
##                                                                                                                toma 
##                                                                                                                   1 
##                                                                                                                 vai 
##                                                                                                                   1 
##                                                                                                   httpbuffly17vo9vn 
##                                                                                                                   1 
##                                                                                                           activists 
##                                                                                                                   1 
##                                                                                                               admit 
##                                                                                                                   1 
##                                                                                                            evidence 
##                                                                                                                   1 
##                                                                                                              expect 
##                                                                                                                   4 
##                                                                                                             planted 
##                                                                                                                   1 
##                                                                                                          georgeoaks 
##                                                                                                                   1 
##                                                                                                       httpowlyopyn7 
##                                                                                                                   1 
##                                                                                                               sobre 
##                                                                                                                   1 
##                                                                                                             brought 
##                                                                                                                   2 
##                                                                                                             cracked 
##                                                                                                                   4 
##                                                                                                   httpfbme2yczjotih 
##                                                                                                                   1 
##                                                                                                   httpfbme2rus2jzni 
##                                                                                                                   1 
##                                                                                                          cherylcole 
##                                                                                                                   1 
##                                                                                                   httpfbme2pmmkdyvh 
##                                                                                                                   1 
##                                                                                                              action 
##                                                                                                                   1 
##                                                                                                               emoji 
##                                                                                                                   9 
##                                                                                                            exhibitk 
##                                                                                                                   1 
##                                                                                                                 haa 
##                                                                                                                   1 
##                                                                                                            describe 
##                                                                                                                   1 
##                                                                                                              emojis 
##                                                                                                                   3 
##                                                                                                               pants 
##                                                                                                                   1 
##                                                                                                               truly 
##                                                                                                                   2 
##                                                                                                                yoga 
##                                                                                                                   1 
##                                                                                                            betehene 
##                                                                                                                   1 
##                                                                                                                bize 
##                                                                                                                   1 
##                                                                                                              yanlis 
##                                                                                                                   1 
##                                                                                                             yapilan 
##                                                                                                                   1 
##                                                                                                         yapilmistir 
##                                                                                                                   1 
##                                                                                                             kaitlin 
##                                                                                                                   1 
##                                                                                                        kaitlinbongo 
##                                                                                                                   1 
##                                                                                                      antireflective 
##                                                                                                                   1 
##                                                                                                    httpbitly17wle65 
##                                                                                                                   1 
##                                                                                                             crocker 
##                                                                                                                   1 
##                                                                                                   http4sqcom14rqsyb 
##                                                                                                                   1 
##                                                                                                            westlake 
##                                                                                                                   1 
##                                                                                                              airbnb 
##                                                                                                                   1 
##                                                                                                            choosing 
##                                                                                                                   1 
##                                                                                                            european 
##                                                                                                                   1 
##                                                                                                             follows 
##                                                                                                                   1 
##                                                                                                 httponforbes19rhh3k 
##                                                                                                                   1 
##                                                                                                             ireland 
##                                                                                                                   1 
##                                                                                                                rate 
##                                                                                                                   1 
##                                                                                                             seeking 
##                                                                                                                   1 
##                                                                                                                 tax 
##                                                                                                                   1 
##                                                                                                              travel 
##                                                                                                                   1 
##                                                                                                                13th 
##                                                                                                                   1 
##                                                                                                          connection 
##                                                                                                                   1 
##                                                                                                            granular 
##                                                                                                                   1 
##                                                                                                           indicator 
##                                                                                                                   1 
##                                                                                                               meter 
##                                                                                                                   1 
##                                                                                                               panel 
##                                                                                                                   1 
##                                                                                                            settings 
##                                                                                                                   1 
##                                                                                                              signal 
##                                                                                                                   3 
##                                                                                                              status 
##                                                                                                                   1 
##                                                                                                            strength 
##                                                                                                                   1 
##                                                                                                                wifi 
##                                                                                                                   4 
##                                                                                             pictwittercommhvci5fsle 
##                                                                                                                   1 
##                                                                                                            plagiaat 
##                                                                                                                   1 
##                                                                                                             apetece 
##                                                                                                                   1 
##                                                                                                               copia 
##                                                                                                                   1 
##                                                                                                               hacer 
##                                                                                                                   1 
##                                                                                                              ios7gm 
##                                                                                                                   1 
##                                                                                                                 ota 
##                                                                                                                   1 
##                                                                                                           seguridad 
##                                                                                                                   1 
##                                                                                                           bluetooth 
##                                                                                                                   1 
##                                                                                                            changers 
##                                                                                                                   1 
##                                                                                                    httpbitly18w3uph 
##                                                                                                                   1 
##                                                                                                          irmagazine 
##                                                                                                                   1 
##                                                                                                           landscape 
##                                                                                                                   1 
##                                                                                                           mcommerce 
##                                                                                                                   1 
##                                                                                                            mpayment 
##                                                                                                                   1 
##                                                                                                              paypal 
##                                                                                                                   1 
##                                                                                                            ijordans 
##                                                                                                                   3 
##                                                                                                               jzfan 
##                                                                                                                   3 
##                                                                                                   michaeljordanstop 
##                                                                                                                   1 
##                                                                                                               night 
##                                                                                                                   5 
##                                                                                                               shift 
##                                                                                                                   1 
##                                                                                                            18092013 
##                                                                                                                   1 
##                                                                                                               fecha 
##                                                                                                                   1 
##                                                                                                    httpbitly17t8zxo 
##                                                                                                                   1 
##                                                                                                               tiene 
##                                                                                                                   1 
##                                                                                                                 bbm 
##                                                                                                                   1 
##                                                                                                             bbm4all 
##                                                                                                                   2 
##                                                                                                 ichooseblackberry10 
##                                                                                                                   4 
##                                                                                                               ahora 
##                                                                                                                   1 
##                                                                                                               aires 
##                                                                                                                   1 
##                                                                                                               cnnee 
##                                                                                                                   1 
##                                                                                                          desarrollo 
##                                                                                                                   1 
##                                                                                                           imparable 
##                                                                                                                   1 
##                                                                                                                mimo 
##                                                                                                                   1 
##                                                                                                               mundo 
##                                                                                                                   1 
##                                                                                                            potencia 
##                                                                                                                   1 
##                                                                                                         subproducto 
##                                                                                                                   1 
##                                                                                                              collin 
##                                                                                                                   1 
##                                                                                                               issie 
##                                                                                                                   1 
##                                                                                                                 kno 
##                                                                                                                   1 
##                                                                                                               lmaoo 
##                                                                                                                   1 
##                                                                                                         mreasyryder 
##                                                                                                                   1 
##                                                                                                                slow 
##                                                                                                                   4 
##                                                                                                           blatantly 
##                                                                                                                   1 
##                                                                                                                poor 
##                                                                                                                   2 
##                                                                                                             quality 
##                                                                                                                   1 
##                                                                                                               taste 
##                                                                                                                   1 
##                                                                                                              videos 
##                                                                                                                   1 
##                                                                                                          bostonreid 
##                                                                                                                   1 
##                                                                                                              boxing 
##                                                                                                                   1 
##                                                                                                               glove 
##                                                                                                                   1 
##                                                                                                                sign 
##                                                                                                                   2 
##                                                                                                              dinero 
##                                                                                                                   1 
##                                                                                                               exijo 
##                                                                                                                   1 
##                                                                                                              vuelta 
##                                                                                                                   1 
##                                                                                                                cost 
##                                                                                                                   2 
##                                                                                                             katanya 
##                                                                                                                   1 
##                                                                                                                 low 
##                                                                                                                   2 
##                                                                                                                 php 
##                                                                                                                   1 
##                                                                                                            dinosaur 
##                                                                                                                   1 
##                                                                                                             reminds 
##                                                                                                                   1 
##                                                                                                              retard 
##                                                                                                                   1 
##                                                                                                            messages 
##                                                                                                                   2 
##                                                                                                              unsend 
##                                                                                                                   1 
##                                                                                                            germania 
##                                                                                                                   1 
##                                                                                                     httpsharesiysw0 
##                                                                                                                   1 
##                                                                                                              prezzi 
##                                                                                                                   1 
##                                                                                                       techstationit 
##                                                                                                                   1 
##                                                                                                              become 
##                                                                                                                   3 
##                                                                                                           developer 
##                                                                                                                   3 
##                                                                                                               stuff 
##                                                                                                                  13 
##                                                                                                              chrome 
##                                                                                                                   3 
##                                                                                                             luggies 
##                                                                                                                   1 
##                                                                                             pictwittercomlh1k8r7tzu 
##                                                                                                                   1 
##                                                                                                           rendering 
##                                                                                                                   1 
##                                                                                                              retina 
##                                                                                                                   1 
##                                                                                                                test 
##                                                                                                                   3 
##                                                                                                                ugly 
##                                                                                                                   4 
##                                                                                                                 110 
##                                                                                                                   1 
##                                                                                                         fulltimebro 
##                                                                                                                   2 
##                                                                                                                 hip 
##                                                                                                                   2 
##                                                                                                                 200 
##                                                                                                                   2 
##                                                                                                    httpbitly18xpnxl 
##                                                                                                                   1 
##                                                                                                                 pay 
##                                                                                                                   4 
##                                                                                                               trade 
##                                                                                                                   1 
##                                                                                                         venturebeat 
##                                                                                                                   1 
##                                                                                                            laughing 
##                                                                                                                   2 
##                                                                                                              stinks 
##                                                                                                                   1 
##                                                                                                               lodes 
##                                                                                                                   1 
##                                                                                                           twohat007 
##                                                                                                                   1 
##                                                                                                                wold 
##                                                                                                                   1 
##                                                                                                              allows 
##                                                                                                                   1 
##                                                                                                              harder 
##                                                                                                                   3 
##                                                                                                       httpowlyon4ub 
##                                                                                                                   1 
##                                                                                                           emergency 
##                                                                                                                   1 
##                                                                                                            attached 
##                                                                                                                   1 
##                                                                                                                keep 
##                                                                                                                   2 
##                                                                                                             somehow 
##                                                                                                                   1 
##                                                                                                             loading 
##                                                                                                                   3 
##                                                                                                       httphtlyoptnw 
##                                                                                                                   1 
##                                                                                                               diego 
##                                                                                                                   2 
##                                                                                                                lets 
##                                                                                                                   2 
##                                                                                                                nerd 
##                                                                                                                   1 
##                                                                                                               types 
##                                                                                                                   1 
##                                                                                                         droclicquot 
##                                                                                                                   1 
##                                                                                                          soannoying 
##                                                                                                                   1 
##                                                                                                               cloud 
##                                                                                                                   3 
##                                                                                                                list 
##                                                                                                                   2 
##                                                                                                             reading 
##                                                                                                                   1 
##                                                                                                            promoted 
##                                                                                                                   1 
##                                                                                                            autotext 
##                                                                                                                   2 
##                                                                                                          deathmatch 
##                                                                                                                   1 
##                                                                                                                 dev 
##                                                                                                                   1 
##                                                                                                              gamers 
##                                                                                                                   1 
##                                                                                                                 huh 
##                                                                                                                   1 
##                                                                                                            included 
##                                                                                                                   1 
##                                                                                                         davehakkens 
##                                                                                                                   1 
##                                                                                                  httpthndrit14ifdtv 
##                                                                                                                   2 
##                                                                                                                argh 
##                                                                                                                   2 
##                                                                                                              entrar 
##                                                                                                                   1 
##                                                                                                                imac 
##                                                                                                                   2 
##                                                                                                               puedo 
##                                                                                                                   1 
##                                                                                                             cholula 
##                                                                                                                   1 
##                                                                                                                stat 
##                                                                                                                   1 
##                                                                                                     florinnitulescu 
##                                                                                                                   1 
##                                                                                                       helpthefellow 
##                                                                                                                   1 
##                                                                                                               allow 
##                                                                                                                   2 
##                                                                                                          background 
##                                                                                                                   1 
##                                                                                                              change 
##                                                                                                                   4 
##                                                                                                              nitotv 
##                                                                                                                   1 
##                                                                                                              others 
##                                                                                                                   1 
##                                                                                                            guessing 
##                                                                                                                   1 
##                                                                                                              theyre 
##                                                                                                                   6 
##                                                                                             pictwittercomqgm8gdrwfe 
##                                                                                                                   1 
##                                                                                                               gusta 
##                                                                                                                   1 
##                                                                                                               letra 
##                                                                                                                   1 
##                                                                                                              siento 
##                                                                                                                   1 
##                                                                                                              tontos 
##                                                                                                                   1 
##                                                                                                            autofill 
##                                                                                                                   1 
##                                                                                                             evening 
##                                                                                                                   1 
##                                                                                                           protected 
##                                                                                                                   1 
##                                                                                                               theft 
##                                                                                                                   2 
##                                                                                                               thumb 
##                                                                                                                   2 
##                                                                                                          thumbprint 
##                                                                                                                   1 
##                                                                                                           briantong 
##                                                                                                                   1 
##                                                                                                        bridgetcarey 
##                                                                                                                   1 
##                                                                                                             pyrited 
##                                                                                                                   1 
##                                                                                                            autoplay 
##                                                                                                                   1 
##                                                                                                                 fix 
##                                                                                                                  12 
##                                                                                                             netflix 
##                                                                                                                   1 
##                                                                                                             process 
##                                                                                                                   3 
##                                                                                                                fire 
##                                                                                                                   4 
##                                                                                             pictwittercomnnk3vwqalu 
##                                                                                                                   1 
##                                                                                                               fault 
##                                                                                                                   1 
##                                                                                                                 pal 
##                                                                                                                   1 
##                                                                                                        ybarra214amy 
##                                                                                                                   1 
##                                                                                                        accidentally 
##                                                                                                                   2 
##                                                                                                            calendar 
##                                                                                                                   2 
##                                                                                                             deleted 
##                                                                                                                   2 
##                                                                                                                icon 
##                                                                                                                   1 
##                                                                                             pictwittercomdxutjk5evo 
##                                                                                                                   1 
##                                                                                                               short 
##                                                                                                                   6 
##                                                                                                                call 
##                                                                                                                   2 
##                                                                                                            deadmau5 
##                                                                                                                   1 
##                                                                                                                hold 
##                                                                                                                   2 
##                                                                                                            remember 
##                                                                                                                   1 
##                                                                                                                 tbt 
##                                                                                                                   1 
##                                                                                                               shade 
##                                                                                                                   1 
##                                                                                                             throwin 
##                                                                                                                   1 
##                                                                                                              condom 
##                                                                                                                   6 
##                                                                                                              female 
##                                                                                                                   6 
##                                                                                                           statement 
##                                                                                                                   2 
##                                                                                                            convence 
##                                                                                                                   1 
##                                                                                                      httpcortas5oxn 
##                                                                                                                   1 
##                                                                                                             anymore 
##                                                                                                                   2 
##                                                                                                              cracks 
##                                                                                                                   1 
##                                                                                                               crack 
##                                                                                                                   1 
##                                                                                                            phoneits 
##                                                                                                                   1 
##                                                                                                                real 
##                                                                                                                   4 
##                                                                                                              middle 
##                                                                                                                   3 
##                                                                                                               jerks 
##                                                                                                                   1 
##                                                                                                             presale 
##                                                                                                                   2 
##                                                                                                              puttin 
##                                                                                                                   1 
##                                                                                                       httphtlyopzqp 
##                                                                                                                   1 
##                                                                                                                dump 
##                                                                                                                   1 
##                                                                                                             embrace 
##                                                                                                                   1 
##                                                                                                     httpgooglpzqzsq 
##                                                                                                                   1 
##                                                                                                    httpbitly1bgrund 
##                                                                                                                   1 
##                                                                                                           nefarious 
##                                                                                                                   1 
##                                                                                                             servers 
##                                                                                                                   1 
##                                                                                                              stored 
##                                                                                                                   3 
##                                                                                                               sweat 
##                                                                                                                   1 
##                                                                                                             charger 
##                                                                                                                   3 
##                                                                                             pictwittercomcxbjgfjiay 
##                                                                                                                   1 
##                                                                                                          iphoneteam 
##                                                                                                                   2 
##                                                                                                              moving 
##                                                                                                                   2 
##                                                                                                           teamapple 
##                                                                                                                   1 
##                                                                                                            controls 
##                                                                                                                   1 
##                                                                                                            defeated 
##                                                                                                                   1 
##                                                                                                            discount 
##                                                                                                                   2 
##                                                                                                       httpowlyoqlkj 
##                                                                                                                   1 
##                                                                                                            walmarts 
##                                                                                                                   1 
##                                                                                                               front 
##                                                                                                                   1 
##                                                                                                         information 
##                                                                                                                   3 
##                                                                                                        ivankostynyk 
##                                                                                                                   1 
##                                                                                                             leakage 
##                                                                                                                   1 
##                                                                                                               verge 
##                                                                                                                   1 
##                                                                                                               beats 
##                                                                                                                   1 
##                                                                                                          benchmarks 
##                                                                                                                   1 
##                                                                                                           dualcores 
##                                                                                                                   1 
##                                                                                                              pieces 
##                                                                                                                   1 
##                                                                                                           quadcores 
##                                                                                                                   1 
##                                                                                                          tarekalaya 
##                                                                                                                   1 
##                                                                                                         indirilmeye 
##                                                                                                                   1 
##                                                                                                            sunulmus 
##                                                                                                                   1 
##                                                                                                                kill 
##                                                                                                                   1 
##                                                                                                                 mom 
##                                                                                                                   1 
##                                                                                             pictwittercomhacmrms5i1 
##                                                                                                                   1 
##                                                                                                         advertising 
##                                                                                                                   1 
##                                                                                                          terrorists 
##                                                                                                                   1 
##                                                                                                                 won 
##                                                                                                                   2 
##                                                                                                               fixed 
##                                                                                                                   2 
##                                                                                             pictwittercomes1ln0abgc 
##                                                                                                                   1 
##                                                                                                            uglyapps 
##                                                                                                                   1 
##                                                                                                       httpowlyon9uo 
##                                                                                                                   1 
##                                                                                                     socialparty2013 
##                                                                                                                   1 
##                                                                                                               speck 
##                                                                                                                   1 
##                                                                                                                 bby 
##                                                                                                                   1 
##                                                                                                                eres 
##                                                                                                                   1 
##                                                                                                                hola 
##                                                                                                                   1 
##                                                                                                             sensual 
##                                                                                                                   1 
##                                                                                                         immediately 
##                                                                                                                   1 
##                                                                                                      mobilekeverett 
##                                                                                                                   1 
##                                                                                                              greedy 
##                                                                                                                   1 
##                                                                                                         interchange 
##                                                                                                                   1 
##                                                                                                       muthafreakers 
##                                                                                                                   1 
##                                                                                                              theyll 
##                                                                                                                   1 
##                                                                                                             message 
##                                                                                                                   1 
##                                                                                                               corps 
##                                                                                                                   1 
##                                                                                                            disclose 
##                                                                                                                   2 
##                                                                                                            emisions 
##                                                                                                                   1 
##                                                                                                            facebook 
##                                                                                                                  13 
##                                                                                                              global 
##                                                                                                                   4 
##                                                                                                    httpbitly18xc8dk 
##                                                                                                                   9 
##                                                                                                                 pwc 
##                                                                                                                   1 
##                                                                                                           customize 
##                                                                                                                   1 
##                                                                                                              groups 
##                                                                                                                   1 
##                                                                                                               icons 
##                                                                                                                   1 
##                                                                                                                psst 
##                                                                                                                   1 
##                                                                                                               cords 
##                                                                                                                   2 
##                                                                                                            sturdier 
##                                                                                                                   1 
##                                                                                                             pouring 
##                                                                                                                   1 
##                                                                                                             raining 
##                                                                                                                   1 
##                                                                                                             vadaydg 
##                                                                                                                   1 
##                                                                                                             banging 
##                                                                                                                   1 
##                                                                                                          champfered 
##                                                                                                                   1 
##                                                                                                            cowbells 
##                                                                                                                   1 
##                                                                                                               edges 
##                                                                                                                   1 
##                                                                                                             ibogost 
##                                                                                                                   1 
##                                                                                                            jonyives 
##                                                                                                                   1 
##                                                                                                     theatlantictech 
##                                                                                                                   1 
##                                                                                                              espera 
##                                                                                                                   1 
##                                                                                                              eterna 
##                                                                                                                   1 
##                                                                                                               nuevo 
##                                                                                                                   1 
##                                                                                                              quiero 
##                                                                                                                   1 
##                                                                                                                sido 
##                                                                                                                   1 
##                                                                                                          addictions 
##                                                                                                                   1 
##                                                                                                              carbon 
##                                                                                                                   8 
##                                                                                                                 cdp 
##                                                                                                                   8 
##                                                                                                            emission 
##                                                                                                                   1 
##                                                                                                     guardiansustbiz 
##                                                                                                                   2 
##                                                                                                              effect 
##                                                                                                                   1 
##                                                                                                         fixcontrast 
##                                                                                                                   1 
##                                                                                                                flat 
##                                                                                                                   1 
##                                                                                                          homescreen 
##                                                                                                                   1 
##                                                                                                           needdepth 
##                                                                                                                   1 
##                                                                                                            parallax 
##                                                                                                                   1 
##                                                                                                       annieftmccann 
##                                                                                                                   1 
##                                                                                                             erthing 
##                                                                                                                   1 
##                                                                                                             acampan 
##                                                                                                                   1 
##                                                                                                              afuera 
##                                                                                                                   1 
##                                                                                                             comprar 
##                                                                                                                   1 
##                                                                                                           japoneses 
##                                                                                                                   1 
##                                                                                             pictwittercom0xupojfq3z 
##                                                                                                                   1 
##                                                                                                              tienda 
##                                                                                                                   1 
##                                                                                                               tokio 
##                                                                                                                   1 
##                                                                                                                 bed 
##                                                                                                                   1 
##                                                                                                                woke 
##                                                                                                                   2 
##                                                                                                                 act 
##                                                                                                                   1 
##                                                                                                                lose 
##                                                                                                                   2 
##                                                                                                            activist 
##                                                                                                                   1 
##                                                                                                      httppostf06pn5 
##                                                                                                                   1 
##                                                                                                                post 
##                                                                                                                   3 
##                                                                                                           unmasking 
##                                                                                                                   1 
##                                                                                                             endless 
##                                                                                                                   1 
##                                                                                                   httpsdrvms163brns 
##                                                                                                                   1 
##                                                                                                             obvious 
##                                                                                                                   2 
##                                                                                                           reasonsof 
##                                                                                                                   1 
##                                                                                                             wishing 
##                                                                                                                   2 
##                                                                                                              handle 
##                                                                                                                   1 
##                                                                                                         theappleinc 
##                                                                                                                   1 
##                                                                                                           upsetting 
##                                                                                                                   1 
##                                                                                                               weird 
##                                                                                                                   3 
##                                                                                                          liberacion 
##                                                                                                                   1 
##                                                                                                               local 
##                                                                                                                   1 
##                                                                                                               mando 
##                                                                                                                   1 
##                                                                                                            operador 
##                                                                                                                   1 
##                                                                                                           solicitar 
##                                                                                                                   1 
##                                                                                                           bdwallace 
##                                                                                                                   1 
##                                                                                             pictwittercomc6mgamrqmi 
##                                                                                                                   1 
##                                                                                                             liethey 
##                                                                                                                   1 
##                                                                                                                 nah 
##                                                                                                                   1 
##                                                                                                                ihop 
##                                                                                                                   1 
##                                                                                                         threelegged 
##                                                                                                                   1 
##                                                                                                            adopters 
##                                                                                                                   1 
##                                                                                                               taken 
##                                                                                                                   1 
##                                                                                                             filters 
##                                                                                                                   2 
##                                                                                             pictwittercomz05b3sapoy 
##                                                                                                                   1 
##                                                                                                              remove 
##                                                                                                                   1 
##                                                                                                           expliquer 
##                                                                                                                   1 
##                                                                                                              peutil 
##                                                                                                                   1 
##                                                                                                            quelquun 
##                                                                                                                   1 
##                                                                                                               quest 
##                                                                                                                   1 
##                                                                                                       httphtlyopzpn 
##                                                                                                                   1 
##                                                                                                         electronics 
##                                                                                                                   1 
##                                                                                                     httpqzcom123930 
##                                                                                                                   1 
##                                                                                                               label 
##                                                                                                                   1 
##                                                                                                                 100 
##                                                                                                                   2 
##                                                                                                            alumnart 
##                                                                                                                   1 
##                                                                                                             curious 
##                                                                                                                   2 
##                                                                                                                less 
##                                                                                                                   2 
##                                                                                                              mchoto 
##                                                                                                                   1 
##                                                                                                                 mkt 
##                                                                                                                   2 
##                                                                                                              taught 
##                                                                                                                   1 
##                                                                                                           jazzyjeff 
##                                                                                                                   1 
##                                                                                                             normals 
##                                                                                                                   1 
##                                                                                                               queue 
##                                                                                                                   1 
##                                                                                                                rest 
##                                                                                                                   2 
##                                                                                                              uglies 
##                                                                                                                   1 
##                                                                                             pictwittercommh4qf0dam0 
##                                                                                                                   1 
##                                                                                                         illuminated 
##                                                                                                                   1 
##                                                                                                        presentation 
##                                                                                                                   1 
##                                                                                                             presses 
##                                                                                                                   1 
##                                                                                                              access 
##                                                                                                                   4 
##                                                                                                               silly 
##                                                                                                                   2 
##                                                                                                     httpnblogsp1hle 
##                                                                                                                   1 
##                                                                                             pictwittercomom0lzdgirs 
##                                                                                                                   1 
##                                                                                             pictwittercomdnxoecpq3t 
##                                                                                                                   1 
##                                                                                                            dave1010 
##                                                                                                                   1 
##                                                                                                                 sir 
##                                                                                                                   2 
##                                                                                                                bb10 
##                                                                                                                   1 
##                                                                                                    httpbitly17skerj 
##                                                                                                                   1 
##                                                                                                            ipadmini 
##                                                                                                                   1 
##                                                                                                                 qnx 
##                                                                                                                   1 
##                                                                                                                 z10 
##                                                                                                                   1 
##                                                                                                             payment 
##                                                                                                                   1 
##                                                                                                              teases 
##                                                                                                                   1 
##                                                                                                               weeks 
##                                                                                                                   3 
##                                                                                                            computer 
##                                                                                                                   1 
##                                                                                                            bitcoins 
##                                                                                                                   1 
##                                                                                                              compre 
##                                                                                                                   1 
##                                                                                                               lugar 
##                                                                                                                   1 
##                                                                                                                 mal 
##                                                                                                                   1 
##                                                                                                                 bij 
##                                                                                                                   1 
##                                                                                                             deukjes 
##                                                                                                                   1 
##                                                                                                                door 
##                                                                                                                   1 
##                                                                                                            garantie 
##                                                                                                                   1 
##                                                                                                                geen 
##                                                                                                                   1 
##                                                                                                             gekocht 
##                                                                                                                   1 
##                                                                                                                geld 
##                                                                                                                   1 
##                                                                                                               harde 
##                                                                                                                   1 
##                                                                                                               kapot 
##                                                                                                                   1 
##                                                                                                                maar 
##                                                                                                                   1 
##                                                                                                               onzin 
##                                                                                                                   1 
##                                                                                                          protection 
##                                                                                                                   2 
##                                                                                                              schijf 
##                                                                                                                   1 
##                                                                                                             doubles 
##                                                                                                                   1 
##                                                                                                       httpowlyomtwz 
##                                                                                                                   1 
##                                                                                                          incredibly 
##                                                                                                                   1 
##                                                                                                               risky 
##                                                                                                                   1 
##                                                                                                       httphtlyopzps 
##                                                                                                                   1 
##                                                                                                              banned 
##                                                                                                                   2 
##                                                                                              httpyoutubefzg4bcak064 
##                                                                                                                   1 
##                                                                                                                roll 
##                                                                                                                   1 
##                                                                                                            wireless 
##                                                                                                                   1 
##                                                                                                               gmail 
##                                                                                                                   1 
##                                                                                                     gmailapocalypse 
##                                                                                                                   1 
##                                                                                                              landed 
##                                                                                                                   1 
##                                                                                                                 tab 
##                                                                                                                   1 
##                                                                                                                tabs 
##                                                                                                                   1 
##                                                                                                             worried 
##                                                                                                                   1 
##                                                                                                             antenna 
##                                                                                                                   1 
##                                                                                                                asia 
##                                                                                                                   1 
##                                                                                                               lunch 
##                                                                                                                   1 
##                                                                                                       nonauthorized 
##                                                                                                                   1 
##                                                                                                                5s5c 
##                                                                                                                   2 
##                                                                                                              adjust 
##                                                                                                                   1 
##                                                                                                             contain 
##                                                                                                                   1 
##                                                                                                         innovations 
##                                                                                                                   2 
##                                                                                                               major 
##                                                                                                                   1 
##                                                                                                         shallowness 
##                                                                                                                   1 
##                                                                                                        destructions 
##                                                                                                                   1 
##                                                                                             pictwittercomepn891eak7 
##                                                                                                                   1 
##                                                                                                        avidprotools 
##                                                                                                                   2 
##                                                                                                                cust 
##                                                                                                                   1 
##                                                                                                      muldoonpatrick 
##                                                                                                                   1 
##                                                                                                                serv 
##                                                                                                                   1 
##                                                                                                            potshots 
##                                                                                                                   1 
##                                                                                                   httplnkdinbmwsyrr 
##                                                                                                                   1 
##                                                                                                           highlight 
##                                                                                                                   1 
##                                                                                                        uncapitalize 
##                                                                                                                   1 
##                                                                                                               ios7s 
##                                                                                                                   2 
##                                                                                                              reveal 
##                                                                                                                   2 
##                                                                                                               allre 
##                                                                                                                   1 
##                                                                                                              friend 
##                                                                                                                   1 
##                                                                                                             lawsuit 
##                                                                                                                   2 
##                                                                                                            standing 
##                                                                                                                   2 
##                                                                                                              unless 
##                                                                                                                   1 
##                                                                                                              havent 
##                                                                                                                   2 
##                                                                                                         matthouse15 
##                                                                                                                   1 
##                                                                                                          considered 
##                                                                                                                   1 
##                                                                                                                gigs 
##                                                                                                                   2 
##                                                                                                          sufficient 
##                                                                                                                   1 
##                                                                                                                2002 
##                                                                                                                   1 
##                                                                                                           8bitsound 
##                                                                                                                   1 
##                                                                                                                lame 
##                                                                                                                   2 
##                                                                                                           purchased 
##                                                                                                                   1 
##                                                                                                                ring 
##                                                                                                                   1 
##                                                                                                               tones 
##                                                                                                                   1 
##                                                                                                                nano 
##                                                                                                                   2 
##                                                                                                           seriously 
##                                                                                                                   3 
##                                                                                                             walkman 
##                                                                                                                   1 
##                                                                                                              itards 
##                                                                                                                   1 
##                                                                                                      joshanderson09 
##                                                                                                                   2 
##                                                                                                            approved 
##                                                                                                                   1 
##                                                                                                       httphtlyoptod 
##                                                                                                                   1 
##                                                                                                        autocorrects 
##                                                                                                                   1 
##                                                                                                                five 
##                                                                                                                   1 
##                                                                                                          fivefifths 
##                                                                                                                   1 
##                                                                                                             outchea 
##                                                                                                                   1 
##                                                                                                               grand 
##                                                                                                                   1 
##                                                                                                               steep 
##                                                                                                                   1 
##                                                                                                                 ima 
##                                                                                                                   1 
##                                                                                                                omfg 
##                                                                                                                   3 
##                                                                                                              afford 
##                                                                                                                   1 
##                                                                                                                logs 
##                                                                                                                   1 
##                                                                                                             website 
##                                                                                                                   3 
##                                                                                                              longer 
##                                                                                                                   5 
##                                                                                                            supposed 
##                                                                                                                   2 
##                                                                                                      tomfairclough9 
##                                                                                                                   1 
##                                                                                                        goddessvicky 
##                                                                                                                   1 
##                                                                                                             replace 
##                                                                                                                   2 
##                                                                                                                 die 
##                                                                                                                   3 
##                                                                                                             ohhhhhh 
##                                                                                                                   1 
##                                                                                                                lies 
##                                                                                                                   1 
##                                                                                                              silver 
##                                                                                                                   1 
##                                                                                                       httphtlyopzo9 
##                                                                                                                   1 
##                                                                                                           bandwagon 
##                                                                                                                   1 
##                                                                                                               codes 
##                                                                                                                   1 
##                                                                                                              movies 
##                                                                                                                   1 
##                                                                                                          redemption 
##                                                                                                                   1 
##                                                                                                                uvvu 
##                                                                                                                   1 
##                                                                                                                halp 
##                                                                                                                   1 
##                                                                                             pictwittercomzrjco2lejn 
##                                                                                                                   1 
##                                                                                                              alleen 
##                                                                                                                   1 
##                                                                                                            batterij 
##                                                                                                                   1 
##                                                                                                             kapotte 
##                                                                                                                   1 
##                                                                                                               kwijt 
##                                                                                                                   1 
##                                                                                                            telefoon 
##                                                                                                                   1 
##                                                                                                                twee 
##                                                                                                                   1 
##                                                                                                           vervangen 
##                                                                                                                   1 
##                                                                                                               weken 
##                                                                                                                   1 
##                                                                                                                 199 
##                                                                                                                   3 
##                                                                                                                 549 
##                                                                                                                   2 
##                                                                                                            contract 
##                                                                                                                   2 
##                                                                                                     httpsharesijr3q 
##                                                                                                                   1 
##                                                                                                              nexus4 
##                                                                                                                   1 
##                                                                                                             premium 
##                                                                                                                   1 
##                                                                                                               yikes 
##                                                                                                                   1 
##                                                                                                            chargers 
##                                                                                                                  11 
##                                                                                             pictwittercom8c6idlywtc 
##                                                                                                                   1 
##                                                                                             pictwittercom75hrorixpc 
##                                                                                                                   1 
##                                                                                                           childrens 
##                                                                                                                   1 
##                                                                                                          millerjr99 
##                                                                                                                   1 
##                                                                                                              telcos 
##                                                                                                                   1 
##                                                                                                                katy 
##                                                                                                                   1 
##                                                                                                                 smh 
##                                                                                                                   4 
##                                                                                                                 ems 
##                                                                                                                   1 
##                                                                                                                join 
##                                                                                                                   1 
##                                                                                                        milliseconds 
##                                                                                                                   1 
##                                                                                                               takes 
##                                                                                                                   3 
##                                                                                                         unsubscribe 
##                                                                                                                   1 
##                                                                                                   httppopsci14mhgof 
##                                                                                                                   1 
##                                                                                                             linking 
##                                                                                                                   1 
##                                                                                                              popsci 
##                                                                                                                   1 
##                                                                                                                 2nd 
##                                                                                                                   2 
##                                                                                                                appt 
##                                                                                                                   1 
##                                                                                                               blows 
##                                                                                                                   1 
##                                                                                                                rude 
##                                                                                                                   2 
##                                                                                                                soho 
##                                                                                                                   1 
##                                                                                                               staff 
##                                                                                                                   1 
##                                                                                                              trying 
##                                                                                                                   6 
##                                                                                                         avoninspire 
##                                                                                                                   1 
##                                                                                                              prices 
##                                                                                                                   1 
##                                                                                                              sellin 
##                                                                                                                   1 
##                                                                                                             stopped 
##                                                                                                                   2 
##                                                                                                               album 
##                                                                                                                   2 
##                                                                                                          dgdtheband 
##                                                                                                                   1 
##                                                                                                           releasing 
##                                                                                                                   1 
##                                                                                                          acceptable 
##                                                                                                                   1 
##                                                                                                           commodity 
##                                                                                                                   1 
##                                                                                             pictwittercomhgzytex3ya 
##                                                                                                                   1 
##                                                                                                                waay 
##                                                                                                                   1 
##                                                                                                              prints 
##                                                                                                                   2 
##                                                                                                       jeanettehayes 
##                                                                                                                   1 
##                                                                                                          1jazzyjeff 
##                                                                                                                   1 
##                                                                                                              yetits 
##                                                                                                                   1 
##                                                                                                            previous 
##                                                                                                                   1 
##                                                                                                                butt 
##                                                                                                                   5 
##                                                                                                             reddots 
##                                                                                                                   1 
##                                                                                                                 wtf 
##                                                                                                                  14 
##                                                                                                       httphtlyopzms 
##                                                                                                                   1 
##                                                                                                            analysts 
##                                                                                                                   1 
##                                                                                                                 boo 
##                                                                                                                   2 
##                                                                                                               falls 
##                                                                                                                   1 
##                                                                                                              nasdaq 
##                                                                                                                   1 
##                                                                                                                near 
##                                                                                                                   1 
##                                                                                                        desaparecido 
##                                                                                                                   1 
##                                                                                                       descontinuado 
##                                                                                                                   1 
##                                                                                                                esta 
##                                                                                                                   1 
##                                                                                                               gente 
##                                                                                                                   1 
##                                                                                                           increible 
##                                                                                                                   1 
##                                                                                                               sigue 
##                                                                                                                   1 
##                                                                                                               venta 
##                                                                                                                   1 
##                                                                                                                 web 
##                                                                                                                   1 
##                                                                                                           everybody 
##                                                                                                                   1 
##                                                                                                              amazon 
##                                                                                                                  11 
##                                                                                                                 csr 
##                                                                                                                   1 
##                                                                                                           drlarazib 
##                                                                                                                   1 
##                                                                                                       notgoodenough 
##                                                                                                                   1 
##                                                                                                       httphtlyoptmg 
##                                                                                                                   1 
##                                                                                                            approves 
##                                                                                                                   1 
##                                                                                                            gamemode 
##                                                                                                                   1 
##                                                                                                                mcpe 
##                                                                                                                   1 
##                                                                                                                seed 
##                                                                                                                   1 
##                                                                                                              server 
##                                                                                                                   1 
##                                                                                                           whitelist 
##                                                                                                                   1 
##                                                                                                                lied 
##                                                                                                                   1 
##                                                                                                           preorders 
##                                                                                                                   4 
##                                                                                                             yldthng 
##                                                                                                                   1 
##                                                                                                       discontinuing 
##                                                                                                                   1 
##                                                                                                                sale 
##                                                                                                                   1 
##                                                                                                            undercut 
##                                                                                                                   1 
##                                                                                                               thatd 
##                                                                                                                   1 
##                                                                                                             comment 
##                                                                                                                   1 
##                                                                                                           encrypted 
##                                                                                                                   1 
##                                                                                                            involved 
##                                                                                                                   1 
##                                                                                                              wether 
##                                                                                                                   1 
##                                                                                                        evolutionary 
##                                                                                                                   1 
##                                                                                                            goodtime 
##                                                                                                                   1 
##                                                                                                       revolutionary 
##                                                                                                                   1 
##                                                                                                            disaster 
##                                                                                                                   1 
##                                                                                                          ggreenwald 
##                                                                                                                   1 
##                                                                                                      liberationtech 
##                                                                                                                   1 
##                                                                                                               point 
##                                                                                                                   2 
##                                                                                                             selling 
##                                                                                                                   2 
##                                                                                                          tribiztech 
##                                                                                                                   1 
##                                                                                                          etgoldnews 
##                                                                                                                   1 
##                                                                                                            happened 
##                                                                                                                   3 
##                                                                                                       notifications 
##                                                                                                                   2 
##                                                                                                              30mins 
##                                                                                                                   1 
##                                                                                                                 apt 
##                                                                                                                   1 
##                                                                                                   http4sqcom1eoiu9d 
##                                                                                                                   1 
##                                                                                                               crash 
##                                                                                                                   1 
##                                                                                                             scratch 
##                                                                                                                   1 
##                                                                                                   httpusatly19ofic1 
##                                                                                                                   1 
##                                                                                                               40000 
##                                                                                                                   1 
##                                                                                                                6000 
##                                                                                                                   1 
##                                                                                                        rupeefalling 
##                                                                                                                   1 
##                                                                                                                 usa 
##                                                                                                                   1 
##                                                                                                           agreement 
##                                                                                                                   1 
##                                                                                                              alaric 
##                                                                                                                   1 
##                                                                                                   httplnkdinbncwbj3 
##                                                                                                                   1 
##                                                                                                         polarmoment 
##                                                                                                                   1 
##                                                                                                       httphtlyoptjb 
##                                                                                                                   1 
##                                                                                                                 719 
##                                                                                                                   1 
##                                                                                                              canada 
##                                                                                                                   1 
##                                                                                                               basic 
##                                                                                                                   1 
##                                                                                                              broken 
##                                                                                                                   1 
##                                                                                                           difficult 
##                                                                                                                   1 
##                                                                                                  firstworldproblems 
##                                                                                                                   2 
##                                                                                                             iphone4 
##                                                                                                                   1 
##                                                                                                           operation 
##                                                                                                                   1 
##                                                                                                                sept 
##                                                                                                                   2 
##                                                                                                                 til 
##                                                                                                                   1 
##                                                                                                       httphtlyopter 
##                                                                                                                   1 
##                                                                                                             13apple 
##                                                                                                                   1 
##                                                                                                           defending 
##                                                                                                                   1 
##                                                                                                            punk240z 
##                                                                                                                   4 
##                                                                                                              acting 
##                                                                                                                   4 
##                                                                                                             pgaffii 
##                                                                                                                   1 
##                                                                                                             strange 
##                                                                                                                   2 
##                                                                                                             tuesday 
##                                                                                                                   1 
##                                                                                                                 aid 
##                                                                                                                   1 
##                                                                                                           deterrent 
##                                                                                                                   1 
##                                                                                                                opps 
##                                                                                                                   1 
##                                                                                                     scanningsending 
##                                                                                                                   1 
##                                                                                                             thieves 
##                                                                                                                   2 
##                                                                                                                 cth 
##                                                                                                                   1 
##                                                                                                                 epl 
##                                                                                                                   1 
##                                                                                                   httpbddyme14pxi6q 
##                                                                                                                   1 
##                                                                                                        safcofficial 
##                                                                                                                   1 
##                                                                                                                 sbd 
##                                                                                                                   1 
##                                                                                                                sues 
##                                                                                                                   1 
##                                                                                                          sunderland 
##                                                                                                                   1 
##                                                                                                            tanzania 
##                                                                                                                   1 
##                                                                                                              wished 
##                                                                                                                   1 
##                                                                                               httpyoutubedu0qahcb1s 
##                                                                                                                   1 
##                                                                                                      appledevcenter 
##                                                                                                                   1 
##                                                                                                                nope 
##                                                                                                                   1 
##                                                                                                               richp 
##                                                                                                                   1 
##                                                                                                            windows8 
##                                                                                                                   1 
##                                                                                                              losing 
##                                                                                                                   2 
##                                                                                                            mightttt 
##                                                                                                                   1 
##                                                                                                             antoneg 
##                                                                                                                   1 
##                                                                                                          businesses 
##                                                                                                                   1 
##                                                                                                          disappoint 
##                                                                                                                   2 
##                                                                                                       httpowlyomtkb 
##                                                                                                                   1 
##                                                                                                           including 
##                                                                                                                   1 
##                                                                                                               delta 
##                                                                                                                   1 
##                                                                                                            disabled 
##                                                                                                                   1 
##                                                                                                                hack 
##                                                                                                                   1 
##                                                                                                               keeps 
##                                                                                                                   1 
##                                                                                                                lock 
##                                                                                                                   4 
##                                                                                                              messed 
##                                                                                                                   2 
##                                                                                                             showing 
##                                                                                                                   1 
##                                                                                                            accurate 
##                                                                                                                   1 
##                                                                                                                joke 
##                                                                                                                   3 
##                                                                                                             weather 
##                                                                                                                   2 
##                                                                                                             forever 
##                                                                                                                   2 
##                                                                                                               metal 
##                                                                                                                   1 
##                                                                                                       lawschoolsrat 
##                                                                                                                   1 
##                                                                                                                 40k 
##                                                                                                                   1 
##                                                                                                               sells 
##                                                                                                                   1 
##                                                                                                             address 
##                                                                                                                   1 
##                                                                                                             current 
##                                                                                                                   2 
##                                                                                                           producing 
##                                                                                                                   1 
##                                                                                                             pushing 
##                                                                                                                   1 
##                                                                                                                bbry 
##                                                                                                                   1 
##                                                                                                              coffin 
##                                                                                                                   1 
##                                                                                                            dominate 
##                                                                                                                   1 
##                                                                                                          enterprise 
##                                                                                                                   1 
##                                                                                                                nail 
##                                                                                                                   1 
##                                                                                                                demo 
##                                                                                                                   1 
##                                                                                                            free4all 
##                                                                                                                   1 
##                                                                                                              stores 
##                                                                                                                   1 
##                                                                                                           imessages 
##                                                                                                                   1 
##                                                                                                                mind 
##                                                                                                                   2 
##                                                                                                                miss 
##                                                                                                                   2 
##                                                                                                      corporatebully 
##                                                                                                                   1 
##                                                                                                             figured 
##                                                                                                                   1 
##                                                                                                           irritated 
##                                                                                                                   1 
##                                                                                                          aaaaaapple 
##                                                                                                                   1 
##                                                                                                              bright 
##                                                                                                                   1 
##                                                                                                                 dis 
##                                                                                                                   1 
##                                                                                                              paawey 
##                                                                                                                   1 
##                                                                                                             stuffjx 
##                                                                                                                   1 
##                                                                                                               hours 
##                                                                                                                   4 
##                                                                                                              icloud 
##                                                                                                                   2 
##                                                                                                              stupid 
##                                                                                                                   7 
##                                                                                                              upload 
##                                                                                                                   1 
##                                                                                                                beat 
##                                                                                                                   2 
##                                                                                                                drop 
##                                                                                                                   2 
##                                                                                                              locked 
##                                                                                                                   1 
##                                                                                                               swear 
##                                                                                                                   2 
##                                                                                                              classy 
##                                                                                                                   1 
##                                                                                                         traditional 
##                                                                                                                   1 
##                                                                                                                fall 
##                                                                                                                   1 
##                                                                                                             launche 
##                                                                                                                   1 
##                                                                                                              shares 
##                                                                                                                   4 
##                                                                                                             tumbled 
##                                                                                                                   1 
##                                                                                                       cemorecake718 
##                                                                                                                   1 
##                                                                                                      matiucurvegawd 
##                                                                                                                   4 
##                                                                                                                 sus 
##                                                                                                                   5 
##                                                                                                             swaggal 
##                                                                                                                   3 
##                                                                                                                yooo 
##                                                                                                                   7 
##                                                                                                       httphtlyoptny 
##                                                                                                                   1 
##                                                                                                              joking 
##                                                                                                                   2 
##                                                                                             pictwittercomilb1xrqikd 
##                                                                                                                   1 
##                                                                                                               files 
##                                                                                                                   1 
##                                                                                                             syncing 
##                                                                                                                   1 
##                                                                                                           messaging 
##                                                                                                                   1 
##                                                                                                         complacency 
##                                                                                                                   1 
##                                                                                                        corporations 
##                                                                                                                   1 
##                                                                                                             empires 
##                                                                                                                   1 
##                                                                                                         individuals 
##                                                                                                                   1 
##                                                                                                            powerful 
##                                                                                                                   1 
##                                                                                                                brat 
##                                                                                                                   2 
##                                                                                                              burned 
##                                                                                                                   1 
##                                                                                                       polycarbonate 
##                                                                                                                   1 
##                                                                                                             unibody 
##                                                                                                                   1 
##                                                                                                                 ace 
##                                                                                                                   1 
##                                                                                                             phonein 
##                                                                                                                   1 
##                                                                                                              excuse 
##                                                                                                                   1 
##                                                                                                               works 
##                                                                                                                   3 
##                                                                                                             gotdarn 
##                                                                                                                   1 
##                                                                                                               three 
##                                                                                                                   1 
##                                                                                             pictwittercompshfqmmnlt 
##                                                                                                                   1 
##                                                                                                            cheerios 
##                                                                                                                   1 
##                                                                                                               extra 
##                                                                                                                   1 
##                                                                                                             freakin 
##                                                                                                                   2 
##                                                                                                                2005 
##                                                                                                                   2 
##                                                                                                               chose 
##                                                                                                                   1 
##                                                                                                             coulour 
##                                                                                                                   1 
##                                                                                             pictwittercomfocsb1fmqc 
##                                                                                                                   1 
##                                                                                                               fails 
##                                                                                                                   2 
##                                                                                                                 hit 
##                                                                                                                   2 
##                                                                                                       httpowlyoorai 
##                                                                                                                   1 
##                                                                                                         itproportal 
##                                                                                                                   1 
##                                                                                                             plummet 
##                                                                                                                   1 
##                                                                                                              pricey 
##                                                                                                                   1 
##                                                                                                           archrival 
##                                                                                                                   2 
##                                                                                                                asks 
##                                                                                                                   3 
##                                                                                                             divulge 
##                                                                                                                   7 
##                                                                                                           emissions 
##                                                                                                                   7 
##                                                                                                       outperforming 
##                                                                                                                   2 
##                                                                                                            refusing 
##                                                                                                                   3 
##                                                                                                               freak 
##                                                                                                                  37 
##                                                                                                              privet 
##                                                                                                                   1 
##                                                                                                          complexity 
##                                                                                                                   1 
##                                                                                                             heading 
##                                                                                                                   1 
##                                                                                                            offering 
##                                                                                                                   1 
##                                                                                                      simplification 
##                                                                                                                   1 
##                                                                                                             trouble 
##                                                                                                                   1 
##                                                                                                        appleinsider 
##                                                                                                                   1 
##                                                                                                           canada599 
##                                                                                                                   1 
##                                                                                                           canadians 
##                                                                                                                   1 
##                                                                                                              edtech 
##                                                                                                                   1 
##                                                                                                              paying 
##                                                                                                                   1 
##                                                                                             pictwittercome6nvt28xkt 
##                                                                                                                   1 
##                                                                                                                rofl 
##                                                                                                                   1 
##                                                                                                               usa99 
##                                                                                                                   1 
##                                                                                                             coining 
##                                                                                                                   1 
##                                                                                                          fingergate 
##                                                                                                                   1 
##                                                                                                               locks 
##                                                                                                                   1 
##                                                                                                             charged 
##                                                                                                                   1 
##                                                                                                                stay 
##                                                                                                                   2 
##                                                                                                           applerort 
##                                                                                                                   1 
##                                                                                                           australia 
##                                                                                                                   2 
##                                                                                                           extremely 
##                                                                                                                   1 
##                                                                                                          overpriced 
##                                                                                                                   2 
##                                                                                                             morebut 
##                                                                                                                   1 
##                                                                                                                plan 
##                                                                                                                   2 
##                                                                                                            probably 
##                                                                                                                   3 
##                                                                                                         sustainable 
##                                                                                                                   1 
##                                                                                                              common 
##                                                                                                                   1 
##                                                                                                               crowd 
##                                                                                                                   1 
##                                                                                                             ertaysh 
##                                                                                                                   1 
##                                                                                                               bogus 
##                                                                                                                   1 
##                                                                                                             highend 
##                                                                                                                   1 
##                                                                                                            laterfor 
##                                                                                                                   1 
##                                                                                                            obsolete 
##                                                                                                                   1 
##                                                                                             pictwittercomicb7csr5js 
##                                                                                                                   1 
##                                                                                                           arrogance 
##                                                                                                                   1 
##                                                                                                           joconfino 
##                                                                                                                   4 
##                                                                                                              refuse 
##                                                                                                                   5 
##                                                                                                            allowing 
##                                                                                                                   1 
##                                                                                                            anything 
##                                                                                                                   1 
##                                                                                                             pleased 
##                                                                                                                   1 
##                                                                                                            wallmart 
##                                                                                                                   1 
##                                                                                                              covers 
##                                                                                                                   1 
##                                                                                                            pictures 
##                                                                                                                   8 
##                                                                                             pictwittercomykaiihu6yy 
##                                                                                                                   1 
##                                                                                                      delilahevening 
##                                                                                                                   2 
##                                                                                                         pickadilly7 
##                                                                                                                   1 
##                                                                                                              baixou 
##                                                                                                                   1 
##                                                                                                                doer 
##                                                                                                                   1 
##                                                                                                              escola 
##                                                                                                                   1 
##                                                                                                            espirito 
##                                                                                                                   1 
##                                                                                                                feio 
##                                                                                                                   1 
##                                                                                                               ficou 
##                                                                                                                   1 
##                                                                                                             pessoal 
##                                                                                                                   1 
##                                                                                                               samba 
##                                                                                                                   1 
##                                                                                                             royally 
##                                                                                                                   1 
##                                                                                                                runs 
##                                                                                                                   1 
##                                                                                                               screw 
##                                                                                                                   1 
##                                                                                                            warranty 
##                                                                                                                   2 
##                                                                                                         examinercom 
##                                                                                                                   1 
##                                                                                                    httpexmnr15tsudj 
##                                                                                                                   1 
##                                                                                                             survive 
##                                                                                                                   1 
##                                                                                                                bite 
##                                                                                                                   1 
##                                                                                                            consider 
##                                                                                                                   1 
##                                                                                                           diversity 
##                                                                                                                   1 
##                                                                                                     httpsharesiz8kj 
##                                                                                                                   1 
##                                                                                                         racebaiting 
##                                                                                                                   1 
##                                                                                                                tcot 
##                                                                                                                   1 
##                                                                                                            thereval 
##                                                                                                                   1 
##                                                                                                              warned 
##                                                                                                                   1 
##                                                                                                               agree 
##                                                                                                                   1 
##                                                                                                            disgrace 
##                                                                                                                   4 
##                                                                                                               hella 
##                                                                                                                   1 
##                                                                                                                 ish 
##                                                                                                                   2 
##                                                                                                                jawn 
##                                                                                                                   1 
##                                                                                                           secretive 
##                                                                                                                   1 
##                                                                                                           massively 
##                                                                                                                   1 
##                                                                                                         ooooooooooo 
##                                                                                                                   1 
##                                                                                                       underwhelming 
##                                                                                                                   1 
##                                                                                                              golden 
##                                                                                                                   1 
##                                                                                                              jokers 
##                                                                                                                   1 
##                                                                                                               outta 
##                                                                                                                   1 
##                                                                                                             playdoh 
##                                                                                                                   1 
##                                                                                                                fear 
##                                                                                                                   1 
##                                                                                                               steer 
##                                                                                                                   1 
##                                                                                                        wsdottraffic 
##                                                                                                                   1 
##                                                                                                        anticipation 
##                                                                                                                   1 
##                                                                                                        deliberately 
##                                                                                                                   1 
##                                                                                                             purpose 
##                                                                                                                   1 
##                                                                                                            2shaneez 
##                                                                                                                   1 
##                                                                                                             failing 
##                                                                                                                   1 
##                                                                                                    httpbitly14oq6bd 
##                                                                                                                   1 
##                                                                                                            minority 
##                                                                                                                   1 
##                                                                                                              report 
##                                                                                                                   1 
##                                                                                                              adding 
##                                                                                                                   1 
##                                                                                                          conspiracy 
##                                                                                                                   1 
##                                                                                                           noprivacy 
##                                                                                                                   1 
##                                                                                                              saying 
##                                                                                                                   1 
##                                                                                                            theorist 
##                                                                                                                   1 
##                                                                                                      sustainability 
##                                                                                                                   1 
##                                                                                             pictwittercomagel53hcjh 
##                                                                                                                   1 
##                                                                                                           recognize 
##                                                                                                                   1 
##                                                                                                               brats 
##                                                                                                                   1 
##                                                                                                              sudden 
##                                                                                                                   1 
##                                                                                                               bouta 
##                                                                                                                   1 
##                                                                                                                 cop 
##                                                                                                                   1 
##                                                                                                              pissed 
##                                                                                                                   2 
##                                                                                                              refund 
##                                                                                                                   2 
##                                                                                                               tacky 
##                                                                                                                   1 
##                                                                                                            acquires 
##                                                                                                                   1 
##                                                                                                            breaking 
##                                                                                                                   1 
##                                                                                                      disappointment 
##                                                                                                                   2 
##                                                                                                          leapmotion 
##                                                                                                                   1 
##                                                                                                              newton 
##                                                                                                                   1 
##                                                                                                              resale 
##                                                                                                                   1 
##                                                                                                              rights 
##                                                                                                                   1 
##                                                                                                             besides 
##                                                                                                                   1 
##                                                                                                             equally 
##                                                                                                                   1 
##                                                                                                               kitty 
##                                                                                                                   1 
##                                                                                                               youve 
##                                                                                                                   1 
##                                                                                                                 899 
##                                                                                                                   1 
##                                                                                                          99preorder 
##                                                                                                                   1 
##                                                                                                               dodgy 
##                                                                                                                   1 
##                                                                                                                 msm 
##                                                                                                                   1 
##                                                                                                           reporting 
##                                                                                                                   1 
##                                                                                                              budget 
##                                                                                                                   1 
##                                                                                                              failed 
##                                                                                                                   1 
##                                                                                                                 boy 
##                                                                                                                   1 
##                                                                                                        disappointed 
##                                                                                                                   3 
##                                                                                                              hardly 
##                                                                                                                   1 
##                                                                                                            recently 
##                                                                                                                   2 
##                                                                                                          successful 
##                                                                                                                   1 
##                                                                                                             anyways 
##                                                                                                                   1 
##                                                                                                            detailed 
##                                                                                                                   1 
##                                                                                                               downs 
##                                                                                                                   1 
##                                                                                                      specifications 
##                                                                                                                   1 
##                                                                                                                tear 
##                                                                                                                   1 
##                                                                                                           technical 
##                                                                                                                   1 
##                                                                                                       fridaythe13th 
##                                                                                                                   1 
##                                                                                                          frustrated 
##                                                                                                                   1 
##                                                                                                                 sky 
##                                                                                                                   1 
##                                                                                                          conference 
##                                                                                                                   1 
##                                                                                                           misssteve 
##                                                                                                                   1 
##                                                                                                             explain 
##                                                                                                                   1 
##                                                                                                               reset 
##                                                                                                                   1 
##                                                                                                                 set 
##                                                                                                                   1 
##                                                                                                                wake 
##                                                                                                                   1 
##                                                                                                               bybye 
##                                                                                                                   1 
##                                                                                                               betas 
##                                                                                                                   1 
##                                                                                                          reimbursed 
##                                                                                                                   1 
##                                                                                                                uggh 
##                                                                                                                   1 
##                                                                                                              inches 
##                                                                                                                   1 
##                                                                                                                 six 
##                                                                                                                   1 
##                                                                                                            updating 
##                                                                                                                   3 
##                                                                                                                jerk 
##                                                                                                                   1 
##                                                                                                              bitter 
##                                                                                                                   1 
##                                                                                                                find 
##                                                                                                                   1 
##                                                                                                                late 
##                                                                                                                   1 
##                                                                                                     noinfoonwebsite 
##                                                                                                                   1 
##                                                                                                               order 
##                                                                                                                   1 
##                                                                                                              stayed 
##                                                                                                                   1 
##                                                                                                     httpgooglilvi5t 
##                                                                                                                   1 
##                                                                                                       emmmahemmings 
##                                                                                                                   1 
##                                                                                                               alert 
##                                                                                                                   1 
##                                                                                                                bird 
##                                                                                                                   1 
##                                                                                                 itsfreakingannoying 
##                                                                                                                   1 
##                                                                                                                 rid 
##                                                                                                                   1 
##                                                                                                         incremental 
##                                                                                                                   1 
##                                                                                                             require 
##                                                                                                                   1 
##                                                                                                               based 
##                                                                                                                   1 
##                                                                                                          definitely 
##                                                                                                                   2 
##                                                                                                         caterpillar 
##                                                                                                                   1 
##                                                                                                       greenhousegas 
##                                                                                                                   1 
##                                                                                                            shameful 
##                                                                                                                   1 
##                                                                                                          automakers 
##                                                                                                                   1 
##                                                                                                      httpowlyi38hxx 
##                                                                                                                   1 
##                                                                                                       httpowlyopjzk 
##                                                                                                                   1 
##                                                                                                             nissans 
##                                                                                                                   1 
##                                                                                                            blogdiva 
##                                                                                                                   1 
##                                                                                                         certaintyno 
##                                                                                                                   1 
##                                                                                                            database 
##                                                                                                                   1 
##                                                                                                            hearings 
##                                                                                                                   1 
##                                                                                                           nobrainer 
##                                                                                                                   1 
##                                                                                                                 ofa 
##                                                                                                                   1 
##                                                                                                           suckingup 
##                                                                                                                   1 
##                                                                                                              taxesw 
##                                                                                                                   1 
##                                                                                             pictwittercomfrvugeo5ad 
##                                                                                                                   1 
##                                                                                                             meaning 
##                                                                                                                   3 
##                                                                                                           tmcconnon 
##                                                                                                                   2 
##                                                                                                            wilcoxaj 
##                                                                                                                   1 
##                                                                                                               audio 
##                                                                                                                   1 
##                                                                                                                feed 
##                                                                                                                   1 
##                                                                                                                luck 
##                                                                                                                   1 
##                                                                                                        sireltonjohn 
##                                                                                                                   1 
##                                                                                                           wonderful 
##                                                                                                                   1 
##                                                                                                          hahahahaha 
##                                                                                                                   1 
##                                                                                                     http9gagtvv1132 
##                                                                                                                   1 
##                                                                                                          affordable 
##                                                                                                                   1 
##                                                                                                             chinese 
##                                                                                                                   1 
##                                                                                                               irony 
##                                                                                                                   1 
##                                                                                                               labor 
##                                                                                                                   1 
##                                                                                                              reduce 
##                                                                                                                   1 
##                                                                                                           achieving 
##                                                                                                                   1 
##                                                                                                            benefits 
##                                                                                                                   1 
##                                                                                                             hobbled 
##                                                                                                                   1 
##                                                                                                                lack 
##                                                                                                                   2 
##                                                                                                              normal 
##                                                                                                                   1 
##                                                                                                                reap 
##                                                                                                                   1 
##                                                                                                              crying 
##                                                                                                                   1 
##                                                                                                       phonebloksinc 
##                                                                                                                   1 
##                                                                                                                 mad 
##                                                                                                                   3 
##                                                                                                                40mb 
##                                                                                                                   1 
##                                                                                                                55mb 
##                                                                                                                   1 
##                                                                                                                dnld 
##                                                                                                                   1 
##                                                                                                               limit 
##                                                                                                                   1 
##                                                                                                              submit 
##                                                                                                                   1 
##                                                                                                              attack 
##                                                                                                                   1 
##                                                                                                              minute 
##                                                                                                                   1 
##                                                                                                             powered 
##                                                                                                                   1 
##                                                                                                             wouldnt 
##                                                                                                                   1 
##                                                                                                                hype 
##                                                                                                                   1 
##                                                                                                                card 
##                                                                                                                   1 
##                                                                                                          completely 
##                                                                                                                   1 
##                                                                                                                 ihy 
##                                                                                                                   1 
##                                                                                                                 sim 
##                                                                                                                   1 
##                                                                                                             spazzes 
##                                                                                                                   1 
##                                                                                                             opinion 
##                                                                                                                   1 
##                                                                                                      betterstronger 
##                                                                                                                   1 
##                                                                                                              invest 
##                                                                                                                   1 
##                                                                                                             whatnot 
##                                                                                                                   1 
##                                                                                                         fjaskdghdka 
##                                                                                                                   1 
##                                                                                                                 tbh 
##                                                                                                                   1 
##                                                                                                                sort 
##                                                                                                                   1 
##                                                                                                              helped 
##                                                                                                                   2 
##                                                                                                    httpbitly181zl8g 
##                                                                                                                   1 
##                                                                                                           innovates 
##                                                                                                                   1 
##                                                                                                             library 
##                                                                                                                   1 
##                                                                                                             updated 
##                                                                                                                   1 
##                                                                                                               movie 
##                                                                                                                   1 
##                                                                                                                push 
##                                                                                                                   1 
##                                                                                                                rent 
##                                                                                                                   1 
##                                                                                                              frozen 
##                                                                                                                   1 
##                                                                                                              rekaly 
##                                                                                                                   1 
##                                                                                                         australians 
##                                                                                                                   1 
##                                                                                                            complain 
##                                                                                                                   1 
##                                                                                                           instantly 
##                                                                                                                   1 
##                                                                                                             ripping 
##                                                                                                                   1 
##                                                                                                                scam 
##                                                                                                                   1 
##                                                                                                               tries 
##                                                                                                                   1 
##                                                                                                             happend 
##                                                                                                                   1 
##                                                                                                              within 
##                                                                                                                   3 
##                                                                                                            delivers 
##                                                                                                                   1 
##                                                                                                            opposite 
##                                                                                                                   1 
##                                                                                                         performance 
##                                                                                                                   1 
##                                                                                                           sacrifice 
##                                                                                                                   1 
##                                                                                                  emperorsnewclothes 
##                                                                                                                   1 
##                                                                                             pictwittercomd8hsgvughg 
##                                                                                                                   1 
##                                                                                                             variety 
##                                                                                                                   1 
##                                                                                                               crime 
##                                                                                                                   1 
##                                                                                                       cybersecurity 
##                                                                                                                   1 
##                                                                                                 httponforbes17uvr33 
##                                                                                                                   1 
##                                                                                                                risk 
##                                                                                                                   1 
##                                                                                                                 528 
##                                                                                                                   1 
##                                                                                                             serious 
##                                                                                                                   1 
##                                                                                                               whole 
##                                                                                                                   1 
##                                                                                                               later 
##                                                                                                                   2 
##                                                                                                            rejected 
##                                                                                                                   1 
##                                                                                                            services 
##                                                                                                                   1 
##                                                                                                      richellelittle 
##                                                                                                                   1 
##                                                                                                               skype 
##                                                                                                                   1 
##                                                                                                               doors 
##                                                                                                                   1 
##                                                                                  httpwwwmacobservercomtmodeathknell 
##                                                                                                                   1 
##                                                                                                            shutting 
##                                                                                                                   1 
##                                                                                                                anti 
##                                                                                                                   1 
##                                                                                                             impress 
##                                                                                                                   1 
##                                                                                                             talking 
##                                                                                                                   1 
##                                                                                                              delete 
##                                                                                                                   2 
##                                                                                            isthatsohardtounderstand 
##                                                                                                                   1 
##                                                                                                               means 
##                                                                                                                   1 
##                                                                                                            gullible 
##                                                                                                                   1 
##                                                                                               httptinyurlcomnhou46g 
##                                                                                                                   1 
##                                                                                                     iphone5problems 
##                                                                                                                   1 
##                                                                                                            randomly 
##                                                                                                                   1 
##                                                                                                               stops 
##                                                                                                                   1 
##                                                                                                             welfare 
##                                                                                                                   1 
##                                                                                                    httpindpn1efw275 
##                                                                                                                   1 
##                                                                                                                ouch 
##                                                                                                                   1 
##                                                                                                            2011with 
##                                                                                                                   1 
##                                                                                                           cellphone 
##                                                                                                                   1 
##                                                                                                               claim 
##                                                                                                                   1 
##                                                                                                             genuine 
##                                                                                                                   1 
##                                                                                                                scan 
##                                                                                                                   1 
##                                                                                                                beef 
##                                                                                                                   1 
##                                                                                                      biometricstech 
##                                                                                                                   1 
##                                                                                                            gollmann 
##                                                                                                                   1 
##                                                                                                           jeremiahg 
##                                                                                                                   1 
##                                                                                                            purchase 
##                                                                                                                   1 
##                                                                                                                 3yr 
##                                                                                                                   1 
##                                                                                                              glares 
##                                                                                                                   1 
##                                                                                                               prone 
##                                                                                                                   1 
##                                                                                                         skyhelpteam 
##                                                                                                                   1 
##                                                                                                         smartypants 
##                                                                                                                   1 
##                                                                                                                maam 
##                                                                                                                   1 
##                                                                                             pictwittercomopcgnrzyrw 
##                                                                                                                   1 
##                                                                                                                bout 
##                                                                                                                   1 
##                                                                                                           bullstuff 
##                                                                                                                   2 
##                                                                                                             gimmick 
##                                                                                                                   1 
##                                                                                                                 lay 
##                                                                                                                   1 
##                                                                                                           according 
##                                                                                                                   1 
##                                                                                                             bestits 
##                                                                                                                   1 
##                                                                                                       samsungcamera 
##                                                                                                                   1 
##                                                                                                       samsungmobile 
##                                                                                                                   2 
##                                                                                                               erase 
##                                                                                                                   1 
##                                                                                                        reinstalling 
##                                                                                                                   1 
##                                                                                                             decline 
##                                                                                                                   1 
##                                                                                                           impresses 
##                                                                                                                   1 
##                                                                                                            lmkunert 
##                                                                                                                   1 
##                                                                                                          yesterdays 
##                                                                                                                   1 
##                                                                                                               tired 
##                                                                                                                   1 
##                                                                                             pictwittercombn0cfcs1cx 
##                                                                                                                   1 
##                                                                                                              asleep 
##                                                                                                                   1 
##                                                                                                               wheel 
##                                                                                                                   1 
##                                                                                                                 1am 
##                                                                                                                   1 
##                                                                                                              cheers 
##                                                                                                                   1 
##                                                                                                             crapple 
##                                                                                                                   2 
##                                                                                                       fingerprinted 
##                                                                                                                   1 
##                                                                                                               spent 
##                                                                                                                   3 
##                                                                                                               niqqa 
##                                                                                                                   1 
##                                                                                                               exact 
##                                                                                                                   1 
##                                                                                                              murder 
##                                                                                                                   1 
##                                                                                                              bridge 
##                                                                                                                   1 
##                                                                                                              chaban 
##                                                                                                                   1 
##                                                                                                              delmas 
##                                                                                                                   1 
##                                                                                             pictwittercomrko36pyt9v 
##                                                                                                                   1 
##                                                                                                             timcook 
##                                                                                                                   1 
##                                                                                                       darnyouiphone 
##                                                                                                                   1 
##                                                                                                          downloaded 
##                                                                                                                   2 
##                                                                                                           restoring 
##                                                                                                                   1 
##                                                                                                                crap 
##                                                                                                                   3 
##                                                                                                                 eye 
##                                                                                                                   1 
##                                                                                                               lifes 
##                                                                                                                   1 
##                                                                                                             minutes 
##                                                                                                                   1 
##                                                                                                             painful 
##                                                                                                                   1 
##                                                                                                 plannedobsolescence 
##                                                                                                                   1 
##                                                                                                               16gbs 
##                                                                                                                   1 
##                                                                                                              memory 
##                                                                                                                   1 
##                                                                                                         considering 
##                                                                                                                   1 
##                                                                                                       customization 
##                                                                                                                   1 
##                                                                                                           wallpaper 
##                                                                                                                   1 
##                                                                                                      caterpillarinc 
##                                                                                                                   1 
##                                                                                                             comcast 
##                                                                                                                   1 
##                                                                                                            dynamics 
##                                                                                                                   1 
##                                                                                                             general 
##                                                                                                                   1 
##                                                                                                      gileadsciences 
##                                                                                                                   1 
##                                                                                                               shame 
##                                                                                                                   5 
##                                                                                                                 twc 
##                                                                                                                   1 
##                                                                                                         businessmen 
##                                                                                                                   1 
##                                                                                                                 run 
##                                                                                                                   2 
##                                                                                                            samssung 
##                                                                                                                   3 
##                                                                                                              vulgar 
##                                                                                                                   3 
##                                                                                                              peeved 
##                                                                                                                   1 
##                                                                                                            eligible 
##                                                                                                                   1 
##                                                                                                            changing 
##                                                                                                                   1 
##                                                                                                                16gb 
##                                                                                                                   1 
##                                                                                                                 740 
##                                                                                                                   1 
##                                                                                                            appletax 
##                                                                                                                   1 
##                                                                                                               bunch 
##                                                                                                                   1 
##                                                                                                              forgot 
##                                                                                                                   1 
##                                                                                                             nimbuzz 
##                                                                                                                   1 
##                                                                                                          comparison 
##                                                                                                                   1 
##                                                                                                              flawed 
##                                                                                                                   1 
##                                                                                                         technically 
##                                                                                                                   1 
##                                                                                                           riveraoor 
##                                                                                                                   1 
##                                                                                                            terrible 
##                                                                                                                   1 
##                                                                                                              lapses 
##                                                                                                                   1 
##                                                                                                            politics 
##                                                                                                                   1 
##                                                                                                           tweetdeck 
##                                                                                                                   1 
##                                                                                                          usefulness 
##                                                                                                                   1 
##                                                                                                     wishihadandroid 
##                                                                                                                   1 
##                                                                                                           cupertino 
##                                                                                                                   1 
##                                                                                                                 fly 
##                                                                                                                   1 
##                                                                                                              nailed 
##                                                                                                                   1 
##                                                                                                              poorly 
##                                                                                                                   1 
##                                                                                                              thinks 
##                                                                                                                   1 
##                                                                                                                wall 
##                                                                                                                   1 
##                                                                                                               feels 
##                                                                                                                   1 
##                                                                                                            alshepmh 
##                                                                                                                   1 
##                                                                                                              gettin 
##                                                                                                                   1 
##                                                                                                               cares 
##                                                                                                                   1 
##                                                                                                             changes 
##                                                                                                                   1 
##                                                                                                            ecstatic 
##                                                                                                                   1 
##                                                                                                         smartphones 
##                                                                                                                   1 
##                                                                                                             trippin 
##                                                                                                                   1 
##                                                                                                               grave 
##                                                                                                                   1 
##                                                                                                             regular 
##                                                                                                                   1 
##                                                                                                             turning 
##                                                                                                                   1 
##                                                                                                              differ 
##                                                                                                                   1 
##                                                                                                    httpbitly15v6twt 
##                                                                                                                   1 
##                                                                                                              secure 
##                                                                                                                   1 
##                                                                                                         appointment 
##                                                                                                                   1 
##                                                                                                           catherine 
##                                                                                                                   1 
##                                                                                                             decided 
##                                                                                                                   2 
##                                                                                                          digitizers 
##                                                                                                                   1 
##                                                                                                             stuffty 
##                                                                                                                   2 
##                                                                                                            personal 
##                                                                                                                   1 
##                                                                                                             pulling 
##                                                                                                                   1 
##                                                                                                               click 
##                                                                                                                   1 
##                                                                                                              liking 
##                                                                                                                   1 
##                                                                                                   httpziteto181fvic 
##                                                                                                                   1 
##                                                                                                           breakable 
##                                                                                                                   1 
##                                                                                                              easily 
##                                                                                                                   1 
##                                                                                                                 rob 
##                                                                                                                   1 
##                                                                                                           earphones 
##                                                                                                                   1 
##                                                                                                             judging 
##                                                                                                                   1 
##                                                                                                               satan 
##                                                                                                                   1 
##                                                                                                             swollen 
##                                                                                                                   1 
##                                                                                                              length 
##                                                                                                                   1 
##                                                                                                         itsannoying 
##                                                                                                                   1 
##                                                                                                              famous 
##                                                                                                                   1 
##                                                                                                              misled 
##                                                                                                                   1 
##                                                                                                                ways 
##                                                                                                                   1 
##                                                                                                         convolution 
##                                                                                                                   1 
##                                                                                                           interface 
##                                                                                                                   1 
##                                                                                                                mess 
##                                                                                                                   1 
##                                                                                                                 5th 
##                                                                                                                   2 
##                                                                                                               smmfh 
##                                                                                                                   1 
##                                                                                                                menu 
##                                                                                                                   1 
##                                                                                                           entertain 
##                                                                                                                   1 
##                                                                                                           offerings 
##                                                                                                                   1 
##                                                                                                              answer 
##                                                                                                                   1 
##                                                                                                           ouukillem 
##                                                                                                                   2 
##                                                                                                            glorious 
##                                                                                                                   1 
##                                                                                                             pissing 
##                                                                                                                   1 
##                                                                                                               radio 
##                                                                                                                   1 
##                                                                                                             climate 
##                                                                                                                   1 
##                                                                                                   httpgucomp3tyeptw 
##                                                                                                                   2 
##                                                                                                                 gap 
##                                                                                                                   1 
##                                                                                                                bruh 
##                                                                                                                   1 
##                                                                                                           vibrating 
##                                                                                                                   1 
##                                                                                                          beforehand 
##                                                                                                                   1 
## httpwwwwiredcomopinion201309theunexpectedresultoffingerprintauthenticationthatyoucanttakethefifthmbidsocial11837204 
##                                                                                                                   1 
##                                                                                                             lawyers 
##                                                                                                                   1 
##                                                                                                                youd 
##                                                                                                                   1 
##                                                                                                              errors 
##                                                                                                                   1 
##                                                                                                                 kid 
##                                                                                                                   1 
##                                                                                                              school 
##                                                                                                                   1 
##                                                                                                            unusable 
##                                                                                                                   1 
##                                                                                                                 600 
##                                                                                                                   1 
##                                                                                                         imagination 
##                                                                                                                   1 
##                                                                                                              goaway 
##                                                                                                                   1 
##                                                                                                           resembles 
##                                                                                                                   1 
##                                                                                                           backwards 
##                                                                                                                   1 
##                                                                                                                step 
##                                                                                                                   1 
##                                                                                                       tactustherapy 
##                                                                                                                   1 
##                                                                                                         unfortunate 
##                                                                                                                   1 
##                                                                                                              defend 
##                                                                                                                   1 
##                                                                                                             ignored 
##                                                                                                                   1 
##                                                                                                          obligation 
##                                                                                                                   1 
##                                                                                                       flightradar24 
##                                                                                                                   1 
##                                                                                                                seen 
##                                                                                                                   2 
##                                                                                                          undetailed 
##                                                                                                                   1 
##                                                                                                         wasteoftime 
##                                                                                                                   1 
##                                                                                                            achieves 
##                                                                                                                   1 
##                                                                                                             boycott 
##                                                                                                                   2 
##                                                                                                               hurts 
##                                                                                                                   1 
##                                                                                                            marching 
##                                                                                                                   1 
##                                                                                                             protest 
##                                                                                                                   1 
##                                                                                                             streets 
##                                                                                                                   1 
##                                                                                                             wallets 
##                                                                                                                   1 
##                                                                                                        applebashing 
##                                                                                                                   1 
##                                                                                                     httpflipitruy1k 
##                                                                                                                   1 
##                                                                                                               north 
##                                                                                                                   1 
##                                                                                                                road 
##                                                                                                                   1 
##                                                                                                          scottsdail 
##                                                                                                                   1 
##                                                                                                          scottsdale 
##                                                                                                                   1 
##                                                                                                                pick 
##                                                                                                                   1 
##                                                                                                        httpaddvccc5 
##                                                                                                                   1 
##                                                                                                                 meh 
##                                                                                                                   1 
##                                                                                                            reaction 
##                                                                                                                   1 
##                                                                                                         underwhelms 
##                                                                                                                   1 
##                                                                                                              effing 
##                                                                                                                   1 
##                                                                                                               slick 
##                                                                                                                   1 
##                                                                                                               asian 
##                                                                                                                   1 
##                                                                                                        ridiculously 
##                                                                                                                   1 
##                                                                                                               focus 
##                                                                                                                   2 
##                                                                                                       myeyesonlumia 
##                                                                                                                   1 
##                                                                                                              profit 
##                                                                                                                   1 
##                                                                                                              turned 
##                                                                                                                   1 
##                                                                                                                tone 
##                                                                                                                   1 
##                                                                                                               nasty 
##                                                                                                                   3 
##                                                                                                          piriyankaa 
##                                                                                                                   1 
##                                                                                                             freaked 
##                                                                                                                   3 
##                                                                                                               lmfao 
##                                                                                                                   1 
##                                                                                                              emails 
##                                                                                                                   1 
##                                                                                                                 gay 
##                                                                                                                   1 
##                                                                                                           admitting 
##                                                                                                                   1 
##                                                                                                                bare 
##                                                                                                                   1 
##                                                                                                               dunno 
##                                                                                                                   1 
##                                                                                                            exchange 
##                                                                                                                   1 
##                                                                                                               execs 
##                                                                                                                   1 
##                                                                                                               faces 
##                                                                                                                   1 
##                                                                                                             fooling 
##                                                                                                                   1 
##                                                                                                             minimum 
##                                                                                                                   1 
##                                                                                                                 foh 
##                                                                                                                   2 
##                                                                                                            overheat 
##                                                                                                                   1 
##                                                                                                            failures 
##                                                                                                                   1 
##                                                                                                             learned 
##                                                                                                                   1 
##                                                                                                            missteps 
##                                                                                                                   1 
##                                                                                                            mistakes 
##                                                                                                                   1 
##                                                                                                                past 
##                                                                                                                   1 
##                                                                                                             wouldve 
##                                                                                                                   1 
##                                                                                                             utility 
##                                                                                                                   1 
##                                                                                                                 bye 
##                                                                                                                   1 
##                                                                                                              christ 
##                                                                                                                   1 
##                                                                                                                plot 
##                                                                                                                   1 
##                                                                                                                sake 
##                                                                                                                   1 
##                                                                                                           certainly 
##                                                                                                                   1 
##                                                                                                              stands 
##                                                                                                                   1 
##                                                                                                            backdoor 
##                                                                                                                   1 
##                                                                                                        multitasking 
##                                                                                                                   1 
##                                                                                                            swiftest 
##                                                                                                                   1 
##                                                                                                               trail 
##                                                                                                                   1 
##                                                                                                            androids 
##                                                                                                                   1 
##                                                                                                           switching 
##                                                                                                                   3 
##                                                                                                             copying 
##                                                                                                                   1 
##                                                                                                   httpsdrvms161bqvl 
##                                                                                                                   1 
##                                                                                                              nearly 
##                                                                                                                   1 
##                                                                                                           pissedout 
##                                                                                                                   1 
##                                                                                             theregoesallmydatausage 
##                                                                                                                   1 
##                                                                                                               weeki 
##                                                                                                                   1 
##                                                                                                              worked 
##                                                                                                                   1 
##                                                                                                             trailer 
##                                                                                                                   1 
##                                                                                                             blinded 
##                                                                                                                   1 
##                                                                                                              hatred 
##                                                                                                                   1 
##                                                                                                          misleading 
##                                                                                                                   1 
##                                                                                                          statements 
##                                                                                                                   1 
##                                                                                                               sucks 
##                                                                                                                   2 
##                                                                                                             texting 
##                                                                                                                   1 
##                                                                                                        extrodilarry 
##                                                                                                                   1 
##                                                                                                            freakong 
##                                                                                                                   1 
##                                                                                                            butthole 
##                                                                                                                   1 
##                                                                                                         ughnarrybye 
##                                                                                                                   1 
##                                                                                                             usually 
##                                                                                                                   1 
##                                                                                                         deltaassist 
##                                                                                                                   1 
##                                                                                                            invasive 
##                                                                                                                   1 
##                                                                                                             removed 
##                                                                                                                   1 
##                                                                                                               catch 
##                                                                                                                   1 
##                                                                                                            slipping 
##                                                                                                                   1 
##                                                                                                               nudes 
##                                                                                                                   1 
##                                                                                                                 ngo 
##                                                                                                                   2 
##                                                                                                            creating 
##                                                                                                                   1 
##                                                                                                                full 
##                                                                                                                   1 
##                                                                                                          fullcharge 
##                                                                                                                   1 
##                                                                                                                 hrs 
##                                                                                                                   1 
##                                                                                                             retweet 
##                                                                                                                   1 
##                                                                                                               wifes 
##                                                                                                                   1 
##                                                                                                               clean 
##                                                                                                                   1 
##                                                                                                                 500 
##                                                                                                                   1 
##                                                                                                             goddarn 
##                                                                                                                   1 
##                                                                                                          undercover 
##                                                                                                                   1 
##                                                                                                           cdproject 
##                                                                                                                   1 
##                                                                                                                 co2 
##                                                                                                                   1 
##                                                                                                       disappointing 
##                                                                                                                   1 
##                                                                                                             freezes 
##                                                                                                                   1 
##                                                                                                            hundreds 
##                                                                                                                   1 
##                                                                                                               dafuq 
##                                                                                                                   1 
##                                                                                                               shots 
##                                                                                                                   1 
##                                                                                                                 ant 
##                                                                                                                   1 
##                                                                                                               balls 
##                                                                                                                   1 
##                                                                                                        intelcputhat 
##                                                                                                                   1 
##                                                                                                             machine 
##                                                                                                                   1 
##                                                                                                            switched 
##                                                                                                                   1 
##                                                                                                          disclosing 
##                                                                                                                   1 
##                                                                                                           footprint 
##                                                                                                                   1 
##                                                                                                            guardian 
##                                                                                                                   1 
##                                                                                                        taxavoidance 
##                                                                                                                   1 
##                                                                                                                55cs 
##                                                                                                                   1 
##                                                                                                                 air 
##                                                                                                                   1 
##                                                                                                              return 
##                                                                                                                   1 
##                                                                                                            deepfail 
##                                                                                                                   1 
##                                                                                                                ease 
##                                                                                                                   1 
##                                                                                                              killed 
##                                                                                                                   1 
##                                                                                                             killing 
##                                                                                                                   1 
##                                                                                                             notcool 
##                                                                                                                   1 
##                                                                                                            speedand 
##                                                                                                                   1 
##                                                                                                               upset 
##                                                                                                                   1 
##                                                                                                             improve 
##                                                                                                                   1 
##                                                                                                              freaks 
##                                                                                                                   2 
##                                                                                                            snapchat 
##                                                                                                                   1 
##                                                                                                                load 
##                                                                                                                   2 
##                                                                                                           shortages 
##                                                                                                                   1 
##                                                                                                              boring 
##                                                                                                                   1 
##                                                                                                                scum 
##                                                                                                                   1 
##                                                                                                             italics 
##                                                                                                                   1 
##                                                                                                             jlilest 
##                                                                                                                   1 
##                                                                                                               punch 
##                                                                                                                   1 
##                                                                                                               court 
##                                                                                                                   1 
##                                                                                                             happens 
##                                                                                                                   1 
##                                                                                                        misspellings 
##                                                                                                                   1 
##                                                                                                       motherfreaker 
##                                                                                                                   1 
##                                                                                                                 cow 
##                                                                                                                   2 
##                                                                                                            crashing 
##                                                                                                                   1 
##                                                                                                             editing 
##                                                                                                                   1 
##                                                                                                               photo 
##                                                                                                                   1 
##                                                                                                             beasted 
##                                                                                                                   1 
##                                                                                                                 bum 
##                                                                                                                   1 
##                                                                                                     respectroyalty5 
##                                                                                                                   1 
##                                                                                                             ashamed 
##                                                                                                                   1 
##                                                                                                                 dem 
##                                                                                                                   1 
##                                                                                                                 yal 
##                                                                                                                   2 
##                                                                                                                 s2g 
##                                                                                                                   1 
##                                                                                                                 sue 
##                                                                                                                   1 
##                                                                                                                 cry 
##                                                                                                                   1 
##                                                                                                               month 
##                                                                                                                   1 
##                                                                                                               frick 
##                                                                                                                   1 
##                                                                                                            bankrupt 
##                                                                                                                   1 
##                                                                                                             envious 
##                                                                                                                   1 
##                                                                                                               loyal 
##                                                                                                                   1 
##                                                                                                            oxymoron 
##                                                                                                                   1 
##                                                                                                             despise 
##                                                                                                                   1 
##                                                                                             pictwittercom29piieq0ue 
##                                                                                                                   1 
##                                                                                                             belongs 
##                                                                                                                   1 
##                                                                                                               erred 
##                                                                                                                   1 
##                                                                                                         scumbaggery 
##                                                                                                                   1 
##                                                                                                            scumbags 
##                                                                                                                   1 
##                                                                                                               telus 
##                                                                                                                   1 
##                                                                                                             biggest 
##                                                                                                                   2 
##                                                                                                         encountered 
##                                                                                                                   1 
##                                                                                                                dies 
##                                                                                                                   1 
##                                                                                                     iphonecompanies 
##                                                                                                                   1 
##                                                                                                              ruined 
##                                                                                                                   1 
##                                                                                                              cancer 
##                                                                                                                   1 
##                                                                                                               cheep 
##                                                                                                                   1 
##                                                                                                               loose 
##                                                                                                                   1 
##                                                                                                                 nut 
##                                                                                                                   1 
##                                                                                                          testicular 
##                                                                                                                   1 
##                                                                                                               flame 
##                                                                                                                   1 
##                                                                                                          freakapple 
##                                                                                                                   1 
##                                                                                                              stable 
##                                                                                                                   1 
##                                                                                                                 plz 
##                                                                                                                   1 
##                                                                                                             telstra 
##                                                                                                                   1 
##                                                                                                             annoyed 
##                                                                                                                   1 
##                                                                                                                cows 
##                                                                                                                   1 
##                                                                                                         agounalakis 
##                                                                                                                   1

Building a word cloud

Use allTweets to build a word cloud. Make sure to check out the help page for wordcloud if you are not sure how to do this.

Because we are plotting a large number of words, you might get warnings that some of the words could not be fit on the page and were therefore not plotted – this is especially likely if you are using a smaller screen. You can address these warnings by plotting the words smaller. From ?wordcloud, we can see that the “scale” parameter controls the sizes of the plotted words. By default, the sizes range from 4 for the most frequent words to 0.5 for the least frequent, as denoted by the parameter “scale=c(4, 0.5)”. We could obtain a much smaller plot with, for instance, parameter “scale=c(2, 0.25)”.

What is the most common word across all the tweets (it will be the largest in the outputted word cloud)? Please type the word exactly how you see it in the word cloud. The most frequent word might not be printed if you got a warning about words being cut off – if this happened, be sure to follow the instructions in the paragraph above.

wordcloud(words = colnames(allTweets), freq = colSums(allTweets))
## Warning in wordcloud(words = colnames(allTweets), freq = colSums(allTweets)):
## apple could not be fit on page. It will not be plotted.

with new corpus #2

In the previous subproblem, we noted that there is one word with a much higher frequency than the other words. Repeat the steps to load and pre-process the corpus, this time removing the most frequent word in addition to all elements of stopwords(“english”) in the call to tm_map with removeWords. For a refresher on how to remove this additional word, see the Twitter text analytics lecture.

Replace allTweets with the document-term matrix of this new corpus – we will use this updated corpus for the remainder of the assignment.

Create a word cloud with the updated corpus. What is the most common word in this new corpus (the largest word in the outputted word cloud)? The most frequent word might not be printed if you got a warning about words being cut off – if this happened, be sure to follow the instructions in the previous problem.

corpus2 <- Corpus(VectorSource(tweets$Tweet))

corpus2 <- tm_map(corpus2, content_transformer(tolower))
## Warning in tm_map.SimpleCorpus(corpus2, content_transformer(tolower)):
## transformation drops documents
corpus2 <- tm_map(corpus2, removePunctuation)
## Warning in tm_map.SimpleCorpus(corpus2, removePunctuation): transformation drops
## documents
corpus2 <- tm_map(corpus2, removeWords, c("apple",stopwords("english")))
## Warning in tm_map.SimpleCorpus(corpus2, removeWords, c("apple",
## stopwords("english"))): transformation drops documents
dtm2 <- DocumentTermMatrix(corpus2)

allTweets2 <- as.data.frame(as.matrix(dtm2))

wordcloud(words = colnames(allTweets2), freq = colSums(allTweets2), scale = c(2,0.25))

Selecting color palette -> Rcolorbrewer

The use of a palette of colors can often improve the overall effect of a visualization. We can easily select our own colors when plotting; for instance, we could pass c(“red”, “green”, “blue”) as the colors parameter to wordcloud(). The RColorBrewer package, which is based on the ColorBrewer project (colorbrewer.org), provides pre-selected palettes that can lead to more visually appealing images. Though these palettes are designed specifically for coloring maps, we can also use them in our word clouds and other visualizations.

Begin by installing and loading the “RColorBrewer” package. This package may have already been installed and loaded when you installed and loaded the “wordcloud” package, in which case you don’t need to go through this additional installation step. If you obtain errors (for instance, “Error: lazy-load database ‘P’ is corrupt”) after installing and loading the RColorBrewer package and running some of the commands, try closing and re-opening R.

The function brewer.pal() returns color palettes from the ColorBrewer project when provided with appropriate parameters, and the function display.brewer.all() displays the palettes we can choose from.

Which color palette would be most appropriate for use in a word cloud for which we want to use color to indicate word frequency?

library(RColorBrewer)

display.brewer.all()

wordcloud(words = colnames(allTweets2), freq = colSums(allTweets2), scale = c(2,0.25),
          min.freq = 10, random.order = FALSE,
          colors = brewer.pal(9, "YlOrRd")[-1:-4])

Task 4 : Bonus, visualizing parole

Using the read.csv function, load the dataset parole.csv and call it parole. Since male, state, and crime are all unordered factors, convert them to factor variables using the following commands:

parole\(male = as.factor(parole\)male)

parole\(state = as.factor(parole\)state)

parole\(crime = as.factor(parole\)crime)

What fraction of parole violators are female?

parole <- read.csv("parole.csv")
parole$male = as.factor(parole$male)

parole$state = as.factor(parole$state)

parole$crime = as.factor(parole$crime)

str(parole)
## 'data.frame':    675 obs. of  9 variables:
##  $ male             : Factor w/ 2 levels "0","1": 2 1 2 2 2 2 2 1 1 2 ...
##  $ race             : int  1 1 2 1 2 2 1 1 1 2 ...
##  $ age              : num  33.2 39.7 29.5 22.4 21.6 46.7 31 24.6 32.6 29.1 ...
##  $ state            : Factor w/ 4 levels "1","2","3","4": 1 1 1 1 1 1 1 1 1 1 ...
##  $ time.served      : num  5.5 5.4 5.6 5.7 5.4 6 6 4.8 4.5 4.7 ...
##  $ max.sentence     : int  18 12 12 18 12 18 18 12 13 12 ...
##  $ multiple.offenses: int  0 0 0 0 0 0 0 0 0 0 ...
##  $ crime            : Factor w/ 4 levels "1","2","3","4": 4 3 3 1 1 4 3 1 3 2 ...
##  $ violator         : int  0 0 0 0 0 0 0 0 0 0 ...
table(parole$male)
## 
##   0   1 
## 130 545
table(parole$male, parole$violator)
##    
##       0   1
##   0 116  14
##   1 481  64
130/675
## [1] 0.1925926
130/nrow(parole)
## [1] 0.1925926
14/78
## [1] 0.1794872

Crime in state = 2, subset

kentucky <- subset(parole, state == 2)
View(kentucky)
table(kentucky$crime)
## 
##  1  2  3  4 
## 42 10 64  4

Creating basic histograms

Recall from lecture that in ggplot, we need to specify the dataset, the aesthetic, and the geometry. To create a histogram, the geometry will be geom_histogram. The data we’ll use is parole, and the aesthetic will be the map from a variable to the x-axis of the histogram.

Create a histogram to find out the distribution of the age of parolees, by typing the following command in your R console (you might need to load the ggplot2 package first by typing library(ggplot2) in your R console):

ggplot(data = parole, aes(x = age)) + geom_histogram(binwidth = 5, boundary = 0, color = ‘black’, fill = ‘cornflowerblue’)

What is the age bracket with the most parolees?

ggplot(data = parole, aes(x = age)) + 
  geom_histogram(binwidth = 5, boundary = 0, color = 'black', fill = 'cornflowerblue')

Redo

ggplot(data = parole, aes(x = age)) + 
  geom_histogram(binwidth = 5, boundary = 0, color = 'blue', fill = 'cornflowerblue')

Adding another dimension

Now suppose we are interested in seeing how the age distribution of male parolees compares to the age distribution of female parolees.

One option would be to create a heatmap with age on one axis and male (a binary variable in our data set) on the other axis. Another option would be to stick with histograms, but to create a separate histogram for each gender. ggplot has the ability to do this automatically using the facet_grid command.

To create separate histograms for male and female, type the following command into your R console:

ggplot(data = parole, aes(x = age)) + geom_histogram(binwidth = 5, boundary = 0) + facet_grid(male ~ .)

The histogram for female parolees is shown at the top, and the histogram for male parolees is shown at the bottom.

What is the age bracket with the most female parolees?

ggplot(data = parole, aes(x = age)) + 
  geom_histogram(binwidth = 5, boundary = 0) + facet_grid(male ~ .)

Redo

Now change the facet_grid argument to be “.~male” instead of “male~.”. What does this do?

ggplot(data = parole, aes(x = age)) + 
  geom_histogram(binwidth = 5, boundary = 0) + facet_grid(.~ male)

Adding another Dimension

An alternative to faceting is to simply color the different groups differently. To color the data points by group, we need to tell ggplot that a property of the data (male or not male) should be translated to an aesthetic property of the histogram. We can do this by setting the fill parameter within the aesthetic to male.

Run the following command in your R console to produce a histogram where data points are colored by group:

ggplot(data = parole, aes(x = age, fill = male)) + geom_histogram(binwidth = 5, boundary = 0)

Since we didn’t specify colors to use, ggplot will use its default color selection. Let’s change this by defining our own color palette. First, type in your R console:

colorPalette = c(“#000000”, “#E69F00”, “#56B4E9”, “#009E73”, “#F0E442”, “#0072B2”, “#D55E00”, “#CC79A7”)

This is actually a colorblind-friendly palette, desribed on this Cookbook for R page . Now, generate your histogram again, using colorPalette, with the following command:

ggplot(data = parole, aes(x = age, fill = male)) + geom_histogram(binwidth = 5, boundary = 0) + scale_fill_manual(values=colorPalette)

What color is the histogram for the female parolees?

ggplot(data = parole, aes(x = age, fill = male)) + 
  geom_histogram(binwidth = 5, boundary = 0)

colorPalette = c("#000000", "#E69F00", "#56B4E9", "#009E73", "#F0E442", "#0072B2", "#D55E00", "#CC79A7")

ggplot(data = parole, aes(x = age, fill = male)) + 
  geom_histogram(binwidth = 5, boundary = 0) + scale_fill_manual(values=colorPalette)

# dont stack them

ggplot(data = parole, aes(x = age, fill = male)) + 
  geom_histogram(binwidth = 5, boundary = 0, position = "identity", alpha = 0.5) + scale_fill_manual(values=colorPalette)

# TIme saved: another histogram

Now let’s explore another aspect of the data: the amount of time served by parolees. Create a basic histogram like the one we created in Problem 2, but this time with time.served on the x-axis. Set the bin width to one month.

What is the most common length of time served, according to this histogram?

ggplot(data = parole, aes(x = time.served)) + 
  geom_histogram(binwidth = 1, boundary = 0, color = 'black', fill = 'cornflowerblue')

# bin  = 0.1 month

ggplot(data = parole, aes(x = time.served)) + 
  geom_histogram(binwidth = 0.1, boundary = 0, color = 'black', fill = 'cornflowerblue')

# faceting with type of crime

ggplot(data = parole, aes(x = time.served)) + 
  geom_histogram(binwidth = 1, boundary = 0) + facet_grid(.~ crime)

# when we overlay them
ggplot(data = parole, aes(x = time.served, fill = crime)) + 
  geom_histogram(binwidth = 1, boundary = 0, position = "identity", alpha = 0.5) + scale_fill_manual(values=colorPalette)